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

« back to all changes in this revision

Viewing changes to libraries/directory/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 directory package 1.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 directory package'
 
554
PACKAGE_TARNAME='directory'
 
555
PACKAGE_VERSION='1.0'
 
556
PACKAGE_STRING='Haskell directory package 1.0'
 
557
PACKAGE_BUGREPORT='libraries@haskell.org'
 
558
PACKAGE_URL=''
 
559
 
 
560
ac_unique_file="include/HsDirectory.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
EGREP
 
600
GREP
 
601
CPP
 
602
OBJEXT
 
603
EXEEXT
 
604
ac_ct_CC
 
605
CPPFLAGS
 
606
LDFLAGS
 
607
CFLAGS
 
608
CC
 
609
target_alias
 
610
host_alias
 
611
build_alias
 
612
LIBS
 
613
ECHO_T
 
614
ECHO_N
 
615
ECHO_C
 
616
DEFS
 
617
mandir
 
618
localedir
 
619
libdir
 
620
psdir
 
621
pdfdir
 
622
dvidir
 
623
htmldir
 
624
infodir
 
625
docdir
 
626
oldincludedir
 
627
includedir
 
628
localstatedir
 
629
sharedstatedir
 
630
sysconfdir
 
631
datadir
 
632
datarootdir
 
633
libexecdir
 
634
sbindir
 
635
bindir
 
636
program_transform_name
 
637
prefix
 
638
exec_prefix
 
639
PACKAGE_URL
 
640
PACKAGE_BUGREPORT
 
641
PACKAGE_STRING
 
642
PACKAGE_VERSION
 
643
PACKAGE_TARNAME
 
644
PACKAGE_NAME
 
645
PATH_SEPARATOR
 
646
SHELL'
 
647
ac_subst_files=''
 
648
ac_user_opts='
 
649
enable_option_checking
 
650
with_cc
 
651
'
 
652
      ac_precious_vars='build_alias
 
653
host_alias
 
654
target_alias
 
655
CC
 
656
CFLAGS
 
657
LDFLAGS
 
658
LIBS
 
659
CPPFLAGS
 
660
CPP'
 
661
 
 
662
 
 
663
# Initialize some variables set by options.
 
664
ac_init_help=
 
665
ac_init_version=false
 
666
ac_unrecognized_opts=
 
667
ac_unrecognized_sep=
 
668
# The variables have the same names as the options, with
 
669
# dashes changed to underlines.
 
670
cache_file=/dev/null
 
671
exec_prefix=NONE
 
672
no_create=
 
673
no_recursion=
 
674
prefix=NONE
 
675
program_prefix=NONE
 
676
program_suffix=NONE
 
677
program_transform_name=s,x,x,
 
678
silent=
 
679
site=
 
680
srcdir=
 
681
verbose=
 
682
x_includes=NONE
 
683
x_libraries=NONE
 
684
 
 
685
# Installation directory options.
 
686
# These are left unexpanded so users can "make install exec_prefix=/foo"
 
687
# and all the variables that are supposed to be based on exec_prefix
 
688
# by default will actually change.
 
689
# Use braces instead of parens because sh, perl, etc. also accept them.
 
690
# (The list follows the same order as the GNU Coding Standards.)
 
691
bindir='${exec_prefix}/bin'
 
692
sbindir='${exec_prefix}/sbin'
 
693
libexecdir='${exec_prefix}/libexec'
 
694
datarootdir='${prefix}/share'
 
695
datadir='${datarootdir}'
 
696
sysconfdir='${prefix}/etc'
 
697
sharedstatedir='${prefix}/com'
 
698
localstatedir='${prefix}/var'
 
699
includedir='${prefix}/include'
 
700
oldincludedir='/usr/include'
 
701
docdir='${datarootdir}/doc/${PACKAGE_TARNAME}'
 
702
infodir='${datarootdir}/info'
 
703
htmldir='${docdir}'
 
704
dvidir='${docdir}'
 
705
pdfdir='${docdir}'
 
706
psdir='${docdir}'
 
707
libdir='${exec_prefix}/lib'
 
708
localedir='${datarootdir}/locale'
 
709
mandir='${datarootdir}/man'
 
710
 
 
711
ac_prev=
 
712
ac_dashdash=
 
713
for ac_option
 
714
do
 
715
  # If the previous option needs an argument, assign it.
 
716
  if test -n "$ac_prev"; then
 
717
    eval $ac_prev=\$ac_option
 
718
    ac_prev=
 
719
    continue
 
720
  fi
 
721
 
 
722
  case $ac_option in
 
723
  *=*)  ac_optarg=`expr "X$ac_option" : '[^=]*=\(.*\)'` ;;
 
724
  *)    ac_optarg=yes ;;
 
725
  esac
 
726
 
 
727
  # Accept the important Cygnus configure options, so we can diagnose typos.
 
728
 
 
729
  case $ac_dashdash$ac_option in
 
730
  --)
 
731
    ac_dashdash=yes ;;
 
732
 
 
733
  -bindir | --bindir | --bindi | --bind | --bin | --bi)
 
734
    ac_prev=bindir ;;
 
735
  -bindir=* | --bindir=* | --bindi=* | --bind=* | --bin=* | --bi=*)
 
736
    bindir=$ac_optarg ;;
 
737
 
 
738
  -build | --build | --buil | --bui | --bu)
 
739
    ac_prev=build_alias ;;
 
740
  -build=* | --build=* | --buil=* | --bui=* | --bu=*)
 
741
    build_alias=$ac_optarg ;;
 
742
 
 
743
  -cache-file | --cache-file | --cache-fil | --cache-fi \
 
744
  | --cache-f | --cache- | --cache | --cach | --cac | --ca | --c)
 
745
    ac_prev=cache_file ;;
 
746
  -cache-file=* | --cache-file=* | --cache-fil=* | --cache-fi=* \
 
747
  | --cache-f=* | --cache-=* | --cache=* | --cach=* | --cac=* | --ca=* | --c=*)
 
748
    cache_file=$ac_optarg ;;
 
749
 
 
750
  --config-cache | -C)
 
751
    cache_file=config.cache ;;
 
752
 
 
753
  -datadir | --datadir | --datadi | --datad)
 
754
    ac_prev=datadir ;;
 
755
  -datadir=* | --datadir=* | --datadi=* | --datad=*)
 
756
    datadir=$ac_optarg ;;
 
757
 
 
758
  -datarootdir | --datarootdir | --datarootdi | --datarootd | --dataroot \
 
759
  | --dataroo | --dataro | --datar)
 
760
    ac_prev=datarootdir ;;
 
761
  -datarootdir=* | --datarootdir=* | --datarootdi=* | --datarootd=* \
 
762
  | --dataroot=* | --dataroo=* | --dataro=* | --datar=*)
 
763
    datarootdir=$ac_optarg ;;
 
764
 
 
765
  -disable-* | --disable-*)
 
766
    ac_useropt=`expr "x$ac_option" : 'x-*disable-\(.*\)'`
 
767
    # Reject names that are not valid shell variable names.
 
768
    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
 
769
      as_fn_error "invalid feature name: $ac_useropt"
 
770
    ac_useropt_orig=$ac_useropt
 
771
    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
 
772
    case $ac_user_opts in
 
773
      *"
 
774
"enable_$ac_useropt"
 
775
"*) ;;
 
776
      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--disable-$ac_useropt_orig"
 
777
         ac_unrecognized_sep=', ';;
 
778
    esac
 
779
    eval enable_$ac_useropt=no ;;
 
780
 
 
781
  -docdir | --docdir | --docdi | --doc | --do)
 
782
    ac_prev=docdir ;;
 
783
  -docdir=* | --docdir=* | --docdi=* | --doc=* | --do=*)
 
784
    docdir=$ac_optarg ;;
 
785
 
 
786
  -dvidir | --dvidir | --dvidi | --dvid | --dvi | --dv)
 
787
    ac_prev=dvidir ;;
 
788
  -dvidir=* | --dvidir=* | --dvidi=* | --dvid=* | --dvi=* | --dv=*)
 
789
    dvidir=$ac_optarg ;;
 
790
 
 
791
  -enable-* | --enable-*)
 
792
    ac_useropt=`expr "x$ac_option" : 'x-*enable-\([^=]*\)'`
 
793
    # Reject names that are not valid shell variable names.
 
794
    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
 
795
      as_fn_error "invalid feature name: $ac_useropt"
 
796
    ac_useropt_orig=$ac_useropt
 
797
    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
 
798
    case $ac_user_opts in
 
799
      *"
 
800
"enable_$ac_useropt"
 
801
"*) ;;
 
802
      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--enable-$ac_useropt_orig"
 
803
         ac_unrecognized_sep=', ';;
 
804
    esac
 
805
    eval enable_$ac_useropt=\$ac_optarg ;;
 
806
 
 
807
  -exec-prefix | --exec_prefix | --exec-prefix | --exec-prefi \
 
808
  | --exec-pref | --exec-pre | --exec-pr | --exec-p | --exec- \
 
809
  | --exec | --exe | --ex)
 
810
    ac_prev=exec_prefix ;;
 
811
  -exec-prefix=* | --exec_prefix=* | --exec-prefix=* | --exec-prefi=* \
 
812
  | --exec-pref=* | --exec-pre=* | --exec-pr=* | --exec-p=* | --exec-=* \
 
813
  | --exec=* | --exe=* | --ex=*)
 
814
    exec_prefix=$ac_optarg ;;
 
815
 
 
816
  -gas | --gas | --ga | --g)
 
817
    # Obsolete; use --with-gas.
 
818
    with_gas=yes ;;
 
819
 
 
820
  -help | --help | --hel | --he | -h)
 
821
    ac_init_help=long ;;
 
822
  -help=r* | --help=r* | --hel=r* | --he=r* | -hr*)
 
823
    ac_init_help=recursive ;;
 
824
  -help=s* | --help=s* | --hel=s* | --he=s* | -hs*)
 
825
    ac_init_help=short ;;
 
826
 
 
827
  -host | --host | --hos | --ho)
 
828
    ac_prev=host_alias ;;
 
829
  -host=* | --host=* | --hos=* | --ho=*)
 
830
    host_alias=$ac_optarg ;;
 
831
 
 
832
  -htmldir | --htmldir | --htmldi | --htmld | --html | --htm | --ht)
 
833
    ac_prev=htmldir ;;
 
834
  -htmldir=* | --htmldir=* | --htmldi=* | --htmld=* | --html=* | --htm=* \
 
835
  | --ht=*)
 
836
    htmldir=$ac_optarg ;;
 
837
 
 
838
  -includedir | --includedir | --includedi | --included | --include \
 
839
  | --includ | --inclu | --incl | --inc)
 
840
    ac_prev=includedir ;;
 
841
  -includedir=* | --includedir=* | --includedi=* | --included=* | --include=* \
 
842
  | --includ=* | --inclu=* | --incl=* | --inc=*)
 
843
    includedir=$ac_optarg ;;
 
844
 
 
845
  -infodir | --infodir | --infodi | --infod | --info | --inf)
 
846
    ac_prev=infodir ;;
 
847
  -infodir=* | --infodir=* | --infodi=* | --infod=* | --info=* | --inf=*)
 
848
    infodir=$ac_optarg ;;
 
849
 
 
850
  -libdir | --libdir | --libdi | --libd)
 
851
    ac_prev=libdir ;;
 
852
  -libdir=* | --libdir=* | --libdi=* | --libd=*)
 
853
    libdir=$ac_optarg ;;
 
854
 
 
855
  -libexecdir | --libexecdir | --libexecdi | --libexecd | --libexec \
 
856
  | --libexe | --libex | --libe)
 
857
    ac_prev=libexecdir ;;
 
858
  -libexecdir=* | --libexecdir=* | --libexecdi=* | --libexecd=* | --libexec=* \
 
859
  | --libexe=* | --libex=* | --libe=*)
 
860
    libexecdir=$ac_optarg ;;
 
861
 
 
862
  -localedir | --localedir | --localedi | --localed | --locale)
 
863
    ac_prev=localedir ;;
 
864
  -localedir=* | --localedir=* | --localedi=* | --localed=* | --locale=*)
 
865
    localedir=$ac_optarg ;;
 
866
 
 
867
  -localstatedir | --localstatedir | --localstatedi | --localstated \
 
868
  | --localstate | --localstat | --localsta | --localst | --locals)
 
869
    ac_prev=localstatedir ;;
 
870
  -localstatedir=* | --localstatedir=* | --localstatedi=* | --localstated=* \
 
871
  | --localstate=* | --localstat=* | --localsta=* | --localst=* | --locals=*)
 
872
    localstatedir=$ac_optarg ;;
 
873
 
 
874
  -mandir | --mandir | --mandi | --mand | --man | --ma | --m)
 
875
    ac_prev=mandir ;;
 
876
  -mandir=* | --mandir=* | --mandi=* | --mand=* | --man=* | --ma=* | --m=*)
 
877
    mandir=$ac_optarg ;;
 
878
 
 
879
  -nfp | --nfp | --nf)
 
880
    # Obsolete; use --without-fp.
 
881
    with_fp=no ;;
 
882
 
 
883
  -no-create | --no-create | --no-creat | --no-crea | --no-cre \
 
884
  | --no-cr | --no-c | -n)
 
885
    no_create=yes ;;
 
886
 
 
887
  -no-recursion | --no-recursion | --no-recursio | --no-recursi \
 
888
  | --no-recurs | --no-recur | --no-recu | --no-rec | --no-re | --no-r)
 
889
    no_recursion=yes ;;
 
890
 
 
891
  -oldincludedir | --oldincludedir | --oldincludedi | --oldincluded \
 
892
  | --oldinclude | --oldinclud | --oldinclu | --oldincl | --oldinc \
 
893
  | --oldin | --oldi | --old | --ol | --o)
 
894
    ac_prev=oldincludedir ;;
 
895
  -oldincludedir=* | --oldincludedir=* | --oldincludedi=* | --oldincluded=* \
 
896
  | --oldinclude=* | --oldinclud=* | --oldinclu=* | --oldincl=* | --oldinc=* \
 
897
  | --oldin=* | --oldi=* | --old=* | --ol=* | --o=*)
 
898
    oldincludedir=$ac_optarg ;;
 
899
 
 
900
  -prefix | --prefix | --prefi | --pref | --pre | --pr | --p)
 
901
    ac_prev=prefix ;;
 
902
  -prefix=* | --prefix=* | --prefi=* | --pref=* | --pre=* | --pr=* | --p=*)
 
903
    prefix=$ac_optarg ;;
 
904
 
 
905
  -program-prefix | --program-prefix | --program-prefi | --program-pref \
 
906
  | --program-pre | --program-pr | --program-p)
 
907
    ac_prev=program_prefix ;;
 
908
  -program-prefix=* | --program-prefix=* | --program-prefi=* \
 
909
  | --program-pref=* | --program-pre=* | --program-pr=* | --program-p=*)
 
910
    program_prefix=$ac_optarg ;;
 
911
 
 
912
  -program-suffix | --program-suffix | --program-suffi | --program-suff \
 
913
  | --program-suf | --program-su | --program-s)
 
914
    ac_prev=program_suffix ;;
 
915
  -program-suffix=* | --program-suffix=* | --program-suffi=* \
 
916
  | --program-suff=* | --program-suf=* | --program-su=* | --program-s=*)
 
917
    program_suffix=$ac_optarg ;;
 
918
 
 
919
  -program-transform-name | --program-transform-name \
 
920
  | --program-transform-nam | --program-transform-na \
 
921
  | --program-transform-n | --program-transform- \
 
922
  | --program-transform | --program-transfor \
 
923
  | --program-transfo | --program-transf \
 
924
  | --program-trans | --program-tran \
 
925
  | --progr-tra | --program-tr | --program-t)
 
926
    ac_prev=program_transform_name ;;
 
927
  -program-transform-name=* | --program-transform-name=* \
 
928
  | --program-transform-nam=* | --program-transform-na=* \
 
929
  | --program-transform-n=* | --program-transform-=* \
 
930
  | --program-transform=* | --program-transfor=* \
 
931
  | --program-transfo=* | --program-transf=* \
 
932
  | --program-trans=* | --program-tran=* \
 
933
  | --progr-tra=* | --program-tr=* | --program-t=*)
 
934
    program_transform_name=$ac_optarg ;;
 
935
 
 
936
  -pdfdir | --pdfdir | --pdfdi | --pdfd | --pdf | --pd)
 
937
    ac_prev=pdfdir ;;
 
938
  -pdfdir=* | --pdfdir=* | --pdfdi=* | --pdfd=* | --pdf=* | --pd=*)
 
939
    pdfdir=$ac_optarg ;;
 
940
 
 
941
  -psdir | --psdir | --psdi | --psd | --ps)
 
942
    ac_prev=psdir ;;
 
943
  -psdir=* | --psdir=* | --psdi=* | --psd=* | --ps=*)
 
944
    psdir=$ac_optarg ;;
 
945
 
 
946
  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
 
947
  | -silent | --silent | --silen | --sile | --sil)
 
948
    silent=yes ;;
 
949
 
 
950
  -sbindir | --sbindir | --sbindi | --sbind | --sbin | --sbi | --sb)
 
951
    ac_prev=sbindir ;;
 
952
  -sbindir=* | --sbindir=* | --sbindi=* | --sbind=* | --sbin=* \
 
953
  | --sbi=* | --sb=*)
 
954
    sbindir=$ac_optarg ;;
 
955
 
 
956
  -sharedstatedir | --sharedstatedir | --sharedstatedi \
 
957
  | --sharedstated | --sharedstate | --sharedstat | --sharedsta \
 
958
  | --sharedst | --shareds | --shared | --share | --shar \
 
959
  | --sha | --sh)
 
960
    ac_prev=sharedstatedir ;;
 
961
  -sharedstatedir=* | --sharedstatedir=* | --sharedstatedi=* \
 
962
  | --sharedstated=* | --sharedstate=* | --sharedstat=* | --sharedsta=* \
 
963
  | --sharedst=* | --shareds=* | --shared=* | --share=* | --shar=* \
 
964
  | --sha=* | --sh=*)
 
965
    sharedstatedir=$ac_optarg ;;
 
966
 
 
967
  -site | --site | --sit)
 
968
    ac_prev=site ;;
 
969
  -site=* | --site=* | --sit=*)
 
970
    site=$ac_optarg ;;
 
971
 
 
972
  -srcdir | --srcdir | --srcdi | --srcd | --src | --sr)
 
973
    ac_prev=srcdir ;;
 
974
  -srcdir=* | --srcdir=* | --srcdi=* | --srcd=* | --src=* | --sr=*)
 
975
    srcdir=$ac_optarg ;;
 
976
 
 
977
  -sysconfdir | --sysconfdir | --sysconfdi | --sysconfd | --sysconf \
 
978
  | --syscon | --sysco | --sysc | --sys | --sy)
 
979
    ac_prev=sysconfdir ;;
 
980
  -sysconfdir=* | --sysconfdir=* | --sysconfdi=* | --sysconfd=* | --sysconf=* \
 
981
  | --syscon=* | --sysco=* | --sysc=* | --sys=* | --sy=*)
 
982
    sysconfdir=$ac_optarg ;;
 
983
 
 
984
  -target | --target | --targe | --targ | --tar | --ta | --t)
 
985
    ac_prev=target_alias ;;
 
986
  -target=* | --target=* | --targe=* | --targ=* | --tar=* | --ta=* | --t=*)
 
987
    target_alias=$ac_optarg ;;
 
988
 
 
989
  -v | -verbose | --verbose | --verbos | --verbo | --verb)
 
990
    verbose=yes ;;
 
991
 
 
992
  -version | --version | --versio | --versi | --vers | -V)
 
993
    ac_init_version=: ;;
 
994
 
 
995
  -with-* | --with-*)
 
996
    ac_useropt=`expr "x$ac_option" : 'x-*with-\([^=]*\)'`
 
997
    # Reject names that are not valid shell variable names.
 
998
    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
 
999
      as_fn_error "invalid package name: $ac_useropt"
 
1000
    ac_useropt_orig=$ac_useropt
 
1001
    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
 
1002
    case $ac_user_opts in
 
1003
      *"
 
1004
"with_$ac_useropt"
 
1005
"*) ;;
 
1006
      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--with-$ac_useropt_orig"
 
1007
         ac_unrecognized_sep=', ';;
 
1008
    esac
 
1009
    eval with_$ac_useropt=\$ac_optarg ;;
 
1010
 
 
1011
  -without-* | --without-*)
 
1012
    ac_useropt=`expr "x$ac_option" : 'x-*without-\(.*\)'`
 
1013
    # Reject names that are not valid shell variable names.
 
1014
    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
 
1015
      as_fn_error "invalid package name: $ac_useropt"
 
1016
    ac_useropt_orig=$ac_useropt
 
1017
    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
 
1018
    case $ac_user_opts in
 
1019
      *"
 
1020
"with_$ac_useropt"
 
1021
"*) ;;
 
1022
      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--without-$ac_useropt_orig"
 
1023
         ac_unrecognized_sep=', ';;
 
1024
    esac
 
1025
    eval with_$ac_useropt=no ;;
 
1026
 
 
1027
  --x)
 
1028
    # Obsolete; use --with-x.
 
1029
    with_x=yes ;;
 
1030
 
 
1031
  -x-includes | --x-includes | --x-include | --x-includ | --x-inclu \
 
1032
  | --x-incl | --x-inc | --x-in | --x-i)
 
1033
    ac_prev=x_includes ;;
 
1034
  -x-includes=* | --x-includes=* | --x-include=* | --x-includ=* | --x-inclu=* \
 
1035
  | --x-incl=* | --x-inc=* | --x-in=* | --x-i=*)
 
1036
    x_includes=$ac_optarg ;;
 
1037
 
 
1038
  -x-libraries | --x-libraries | --x-librarie | --x-librari \
 
1039
  | --x-librar | --x-libra | --x-libr | --x-lib | --x-li | --x-l)
 
1040
    ac_prev=x_libraries ;;
 
1041
  -x-libraries=* | --x-libraries=* | --x-librarie=* | --x-librari=* \
 
1042
  | --x-librar=* | --x-libra=* | --x-libr=* | --x-lib=* | --x-li=* | --x-l=*)
 
1043
    x_libraries=$ac_optarg ;;
 
1044
 
 
1045
  -*) as_fn_error "unrecognized option: \`$ac_option'
 
1046
Try \`$0 --help' for more information."
 
1047
    ;;
 
1048
 
 
1049
  *=*)
 
1050
    ac_envvar=`expr "x$ac_option" : 'x\([^=]*\)='`
 
1051
    # Reject names that are not valid shell variable names.
 
1052
    case $ac_envvar in #(
 
1053
      '' | [0-9]* | *[!_$as_cr_alnum]* )
 
1054
      as_fn_error "invalid variable name: \`$ac_envvar'" ;;
 
1055
    esac
 
1056
    eval $ac_envvar=\$ac_optarg
 
1057
    export $ac_envvar ;;
 
1058
 
 
1059
  *)
 
1060
    # FIXME: should be removed in autoconf 3.0.
 
1061
    $as_echo "$as_me: WARNING: you should use --build, --host, --target" >&2
 
1062
    expr "x$ac_option" : ".*[^-._$as_cr_alnum]" >/dev/null &&
 
1063
      $as_echo "$as_me: WARNING: invalid host type: $ac_option" >&2
 
1064
    : ${build_alias=$ac_option} ${host_alias=$ac_option} ${target_alias=$ac_option}
 
1065
    ;;
 
1066
 
 
1067
  esac
 
1068
done
 
1069
 
 
1070
if test -n "$ac_prev"; then
 
1071
  ac_option=--`echo $ac_prev | sed 's/_/-/g'`
 
1072
  as_fn_error "missing argument to $ac_option"
 
1073
fi
 
1074
 
 
1075
if test -n "$ac_unrecognized_opts"; then
 
1076
  case $enable_option_checking in
 
1077
    no) ;;
 
1078
    fatal) as_fn_error "unrecognized options: $ac_unrecognized_opts" ;;
 
1079
    *)     $as_echo "$as_me: WARNING: unrecognized options: $ac_unrecognized_opts" >&2 ;;
 
1080
  esac
 
1081
fi
 
1082
 
 
1083
# Check all directory arguments for consistency.
 
1084
for ac_var in   exec_prefix prefix bindir sbindir libexecdir datarootdir \
 
1085
                datadir sysconfdir sharedstatedir localstatedir includedir \
 
1086
                oldincludedir docdir infodir htmldir dvidir pdfdir psdir \
 
1087
                libdir localedir mandir
 
1088
do
 
1089
  eval ac_val=\$$ac_var
 
1090
  # Remove trailing slashes.
 
1091
  case $ac_val in
 
1092
    */ )
 
1093
      ac_val=`expr "X$ac_val" : 'X\(.*[^/]\)' \| "X$ac_val" : 'X\(.*\)'`
 
1094
      eval $ac_var=\$ac_val;;
 
1095
  esac
 
1096
  # Be sure to have absolute directory names.
 
1097
  case $ac_val in
 
1098
    [\\/$]* | ?:[\\/]* )  continue;;
 
1099
    NONE | '' ) case $ac_var in *prefix ) continue;; esac;;
 
1100
  esac
 
1101
  as_fn_error "expected an absolute directory name for --$ac_var: $ac_val"
 
1102
done
 
1103
 
 
1104
# There might be people who depend on the old broken behavior: `$host'
 
1105
# used to hold the argument of --host etc.
 
1106
# FIXME: To remove some day.
 
1107
build=$build_alias
 
1108
host=$host_alias
 
1109
target=$target_alias
 
1110
 
 
1111
# FIXME: To remove some day.
 
1112
if test "x$host_alias" != x; then
 
1113
  if test "x$build_alias" = x; then
 
1114
    cross_compiling=maybe
 
1115
    $as_echo "$as_me: WARNING: If you wanted to set the --build type, don't use --host.
 
1116
    If a cross compiler is detected then cross compile mode will be used." >&2
 
1117
  elif test "x$build_alias" != "x$host_alias"; then
 
1118
    cross_compiling=yes
 
1119
  fi
 
1120
fi
 
1121
 
 
1122
ac_tool_prefix=
 
1123
test -n "$host_alias" && ac_tool_prefix=$host_alias-
 
1124
 
 
1125
test "$silent" = yes && exec 6>/dev/null
 
1126
 
 
1127
 
 
1128
ac_pwd=`pwd` && test -n "$ac_pwd" &&
 
1129
ac_ls_di=`ls -di .` &&
 
1130
ac_pwd_ls_di=`cd "$ac_pwd" && ls -di .` ||
 
1131
  as_fn_error "working directory cannot be determined"
 
1132
test "X$ac_ls_di" = "X$ac_pwd_ls_di" ||
 
1133
  as_fn_error "pwd does not report name of working directory"
 
1134
 
 
1135
 
 
1136
# Find the source files, if location was not specified.
 
1137
if test -z "$srcdir"; then
 
1138
  ac_srcdir_defaulted=yes
 
1139
  # Try the directory containing this script, then the parent directory.
 
1140
  ac_confdir=`$as_dirname -- "$as_myself" ||
 
1141
$as_expr X"$as_myself" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
 
1142
         X"$as_myself" : 'X\(//\)[^/]' \| \
 
1143
         X"$as_myself" : 'X\(//\)$' \| \
 
1144
         X"$as_myself" : 'X\(/\)' \| . 2>/dev/null ||
 
1145
$as_echo X"$as_myself" |
 
1146
    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
 
1147
            s//\1/
 
1148
            q
 
1149
          }
 
1150
          /^X\(\/\/\)[^/].*/{
 
1151
            s//\1/
 
1152
            q
 
1153
          }
 
1154
          /^X\(\/\/\)$/{
 
1155
            s//\1/
 
1156
            q
 
1157
          }
 
1158
          /^X\(\/\).*/{
 
1159
            s//\1/
 
1160
            q
 
1161
          }
 
1162
          s/.*/./; q'`
 
1163
  srcdir=$ac_confdir
 
1164
  if test ! -r "$srcdir/$ac_unique_file"; then
 
1165
    srcdir=..
 
1166
  fi
 
1167
else
 
1168
  ac_srcdir_defaulted=no
 
1169
fi
 
1170
if test ! -r "$srcdir/$ac_unique_file"; then
 
1171
  test "$ac_srcdir_defaulted" = yes && srcdir="$ac_confdir or .."
 
1172
  as_fn_error "cannot find sources ($ac_unique_file) in $srcdir"
 
1173
fi
 
1174
ac_msg="sources are in $srcdir, but \`cd $srcdir' does not work"
 
1175
ac_abs_confdir=`(
 
1176
        cd "$srcdir" && test -r "./$ac_unique_file" || as_fn_error "$ac_msg"
 
1177
        pwd)`
 
1178
# When building in place, set srcdir=.
 
1179
if test "$ac_abs_confdir" = "$ac_pwd"; then
 
1180
  srcdir=.
 
1181
fi
 
1182
# Remove unnecessary trailing slashes from srcdir.
 
1183
# Double slashes in file names in object file debugging info
 
1184
# mess up M-x gdb in Emacs.
 
1185
case $srcdir in
 
1186
*/) srcdir=`expr "X$srcdir" : 'X\(.*[^/]\)' \| "X$srcdir" : 'X\(.*\)'`;;
 
1187
esac
 
1188
for ac_var in $ac_precious_vars; do
 
1189
  eval ac_env_${ac_var}_set=\${${ac_var}+set}
 
1190
  eval ac_env_${ac_var}_value=\$${ac_var}
 
1191
  eval ac_cv_env_${ac_var}_set=\${${ac_var}+set}
 
1192
  eval ac_cv_env_${ac_var}_value=\$${ac_var}
 
1193
done
 
1194
 
 
1195
#
 
1196
# Report the --help message.
 
1197
#
 
1198
if test "$ac_init_help" = "long"; then
 
1199
  # Omit some internal or obsolete options to make the list less imposing.
 
1200
  # This message is too long to be a string in the A/UX 3.1 sh.
 
1201
  cat <<_ACEOF
 
1202
\`configure' configures Haskell directory package 1.0 to adapt to many kinds of systems.
 
1203
 
 
1204
Usage: $0 [OPTION]... [VAR=VALUE]...
 
1205
 
 
1206
To assign environment variables (e.g., CC, CFLAGS...), specify them as
 
1207
VAR=VALUE.  See below for descriptions of some of the useful variables.
 
1208
 
 
1209
Defaults for the options are specified in brackets.
 
1210
 
 
1211
Configuration:
 
1212
  -h, --help              display this help and exit
 
1213
      --help=short        display options specific to this package
 
1214
      --help=recursive    display the short help of all the included packages
 
1215
  -V, --version           display version information and exit
 
1216
  -q, --quiet, --silent   do not print \`checking...' messages
 
1217
      --cache-file=FILE   cache test results in FILE [disabled]
 
1218
  -C, --config-cache      alias for \`--cache-file=config.cache'
 
1219
  -n, --no-create         do not create output files
 
1220
      --srcdir=DIR        find the sources in DIR [configure dir or \`..']
 
1221
 
 
1222
Installation directories:
 
1223
  --prefix=PREFIX         install architecture-independent files in PREFIX
 
1224
                          [$ac_default_prefix]
 
1225
  --exec-prefix=EPREFIX   install architecture-dependent files in EPREFIX
 
1226
                          [PREFIX]
 
1227
 
 
1228
By default, \`make install' will install all the files in
 
1229
\`$ac_default_prefix/bin', \`$ac_default_prefix/lib' etc.  You can specify
 
1230
an installation prefix other than \`$ac_default_prefix' using \`--prefix',
 
1231
for instance \`--prefix=\$HOME'.
 
1232
 
 
1233
For better control, use the options below.
 
1234
 
 
1235
Fine tuning of the installation directories:
 
1236
  --bindir=DIR            user executables [EPREFIX/bin]
 
1237
  --sbindir=DIR           system admin executables [EPREFIX/sbin]
 
1238
  --libexecdir=DIR        program executables [EPREFIX/libexec]
 
1239
  --sysconfdir=DIR        read-only single-machine data [PREFIX/etc]
 
1240
  --sharedstatedir=DIR    modifiable architecture-independent data [PREFIX/com]
 
1241
  --localstatedir=DIR     modifiable single-machine data [PREFIX/var]
 
1242
  --libdir=DIR            object code libraries [EPREFIX/lib]
 
1243
  --includedir=DIR        C header files [PREFIX/include]
 
1244
  --oldincludedir=DIR     C header files for non-gcc [/usr/include]
 
1245
  --datarootdir=DIR       read-only arch.-independent data root [PREFIX/share]
 
1246
  --datadir=DIR           read-only architecture-independent data [DATAROOTDIR]
 
1247
  --infodir=DIR           info documentation [DATAROOTDIR/info]
 
1248
  --localedir=DIR         locale-dependent data [DATAROOTDIR/locale]
 
1249
  --mandir=DIR            man documentation [DATAROOTDIR/man]
 
1250
  --docdir=DIR            documentation root [DATAROOTDIR/doc/directory]
 
1251
  --htmldir=DIR           html documentation [DOCDIR]
 
1252
  --dvidir=DIR            dvi documentation [DOCDIR]
 
1253
  --pdfdir=DIR            pdf documentation [DOCDIR]
 
1254
  --psdir=DIR             ps documentation [DOCDIR]
 
1255
_ACEOF
 
1256
 
 
1257
  cat <<\_ACEOF
 
1258
_ACEOF
 
1259
fi
 
1260
 
 
1261
if test -n "$ac_init_help"; then
 
1262
  case $ac_init_help in
 
1263
     short | recursive ) echo "Configuration of Haskell directory package 1.0:";;
 
1264
   esac
 
1265
  cat <<\_ACEOF
 
1266
 
 
1267
Optional Packages:
 
1268
  --with-PACKAGE[=ARG]    use PACKAGE [ARG=yes]
 
1269
  --without-PACKAGE       do not use PACKAGE (same as --with-PACKAGE=no)
 
1270
C compiler
 
1271
 
 
1272
Some influential environment variables:
 
1273
  CC          C compiler command
 
1274
  CFLAGS      C compiler flags
 
1275
  LDFLAGS     linker flags, e.g. -L<lib dir> if you have libraries in a
 
1276
              nonstandard directory <lib dir>
 
1277
  LIBS        libraries to pass to the linker, e.g. -l<library>
 
1278
  CPPFLAGS    (Objective) C/C++ preprocessor flags, e.g. -I<include dir> if
 
1279
              you have headers in a nonstandard directory <include dir>
 
1280
  CPP         C preprocessor
 
1281
 
 
1282
Use these variables to override the choices made by `configure' or to help
 
1283
it to find libraries and programs with nonstandard names/locations.
 
1284
 
 
1285
Report bugs to <libraries@haskell.org>.
 
1286
_ACEOF
 
1287
ac_status=$?
 
1288
fi
 
1289
 
 
1290
if test "$ac_init_help" = "recursive"; then
 
1291
  # If there are subdirs, report their specific --help.
 
1292
  for ac_dir in : $ac_subdirs_all; do test "x$ac_dir" = x: && continue
 
1293
    test -d "$ac_dir" ||
 
1294
      { cd "$srcdir" && ac_pwd=`pwd` && srcdir=. && test -d "$ac_dir"; } ||
 
1295
      continue
 
1296
    ac_builddir=.
 
1297
 
 
1298
case "$ac_dir" in
 
1299
.) ac_dir_suffix= ac_top_builddir_sub=. ac_top_build_prefix= ;;
 
1300
*)
 
1301
  ac_dir_suffix=/`$as_echo "$ac_dir" | sed 's|^\.[\\/]||'`
 
1302
  # A ".." for each directory in $ac_dir_suffix.
 
1303
  ac_top_builddir_sub=`$as_echo "$ac_dir_suffix" | sed 's|/[^\\/]*|/..|g;s|/||'`
 
1304
  case $ac_top_builddir_sub in
 
1305
  "") ac_top_builddir_sub=. ac_top_build_prefix= ;;
 
1306
  *)  ac_top_build_prefix=$ac_top_builddir_sub/ ;;
 
1307
  esac ;;
 
1308
esac
 
1309
ac_abs_top_builddir=$ac_pwd
 
1310
ac_abs_builddir=$ac_pwd$ac_dir_suffix
 
1311
# for backward compatibility:
 
1312
ac_top_builddir=$ac_top_build_prefix
 
1313
 
 
1314
case $srcdir in
 
1315
  .)  # We are building in place.
 
1316
    ac_srcdir=.
 
1317
    ac_top_srcdir=$ac_top_builddir_sub
 
1318
    ac_abs_top_srcdir=$ac_pwd ;;
 
1319
  [\\/]* | ?:[\\/]* )  # Absolute name.
 
1320
    ac_srcdir=$srcdir$ac_dir_suffix;
 
1321
    ac_top_srcdir=$srcdir
 
1322
    ac_abs_top_srcdir=$srcdir ;;
 
1323
  *) # Relative name.
 
1324
    ac_srcdir=$ac_top_build_prefix$srcdir$ac_dir_suffix
 
1325
    ac_top_srcdir=$ac_top_build_prefix$srcdir
 
1326
    ac_abs_top_srcdir=$ac_pwd/$srcdir ;;
 
1327
esac
 
1328
ac_abs_srcdir=$ac_abs_top_srcdir$ac_dir_suffix
 
1329
 
 
1330
    cd "$ac_dir" || { ac_status=$?; continue; }
 
1331
    # Check for guested configure.
 
1332
    if test -f "$ac_srcdir/configure.gnu"; then
 
1333
      echo &&
 
1334
      $SHELL "$ac_srcdir/configure.gnu" --help=recursive
 
1335
    elif test -f "$ac_srcdir/configure"; then
 
1336
      echo &&
 
1337
      $SHELL "$ac_srcdir/configure" --help=recursive
 
1338
    else
 
1339
      $as_echo "$as_me: WARNING: no configuration information is in $ac_dir" >&2
 
1340
    fi || ac_status=$?
 
1341
    cd "$ac_pwd" || { ac_status=$?; break; }
 
1342
  done
 
1343
fi
 
1344
 
 
1345
test -n "$ac_init_help" && exit $ac_status
 
1346
if $ac_init_version; then
 
1347
  cat <<\_ACEOF
 
1348
Haskell directory package configure 1.0
 
1349
generated by GNU Autoconf 2.65
 
1350
 
 
1351
Copyright (C) 2009 Free Software Foundation, Inc.
 
1352
This configure script is free software; the Free Software Foundation
 
1353
gives unlimited permission to copy, distribute and modify it.
 
1354
_ACEOF
 
1355
  exit
 
1356
fi
 
1357
 
 
1358
## ------------------------ ##
 
1359
## Autoconf initialization. ##
 
1360
## ------------------------ ##
 
1361
 
 
1362
# ac_fn_c_try_compile LINENO
 
1363
# --------------------------
 
1364
# Try to compile conftest.$ac_ext, and return whether this succeeded.
 
1365
ac_fn_c_try_compile ()
 
1366
{
 
1367
  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
 
1368
  rm -f conftest.$ac_objext
 
1369
  if { { ac_try="$ac_compile"
 
1370
case "(($ac_try" in
 
1371
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
1372
  *) ac_try_echo=$ac_try;;
 
1373
esac
 
1374
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
1375
$as_echo "$ac_try_echo"; } >&5
 
1376
  (eval "$ac_compile") 2>conftest.err
 
1377
  ac_status=$?
 
1378
  if test -s conftest.err; then
 
1379
    grep -v '^ *+' conftest.err >conftest.er1
 
1380
    cat conftest.er1 >&5
 
1381
    mv -f conftest.er1 conftest.err
 
1382
  fi
 
1383
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
1384
  test $ac_status = 0; } && {
 
1385
         test -z "$ac_c_werror_flag" ||
 
1386
         test ! -s conftest.err
 
1387
       } && test -s conftest.$ac_objext; then :
 
1388
  ac_retval=0
 
1389
else
 
1390
  $as_echo "$as_me: failed program was:" >&5
 
1391
sed 's/^/| /' conftest.$ac_ext >&5
 
1392
 
 
1393
        ac_retval=1
 
1394
fi
 
1395
  eval $as_lineno_stack; test "x$as_lineno_stack" = x && { as_lineno=; unset as_lineno;}
 
1396
  as_fn_set_status $ac_retval
 
1397
 
 
1398
} # ac_fn_c_try_compile
 
1399
 
 
1400
# ac_fn_c_try_cpp LINENO
 
1401
# ----------------------
 
1402
# Try to preprocess conftest.$ac_ext, and return whether this succeeded.
 
1403
ac_fn_c_try_cpp ()
 
1404
{
 
1405
  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
 
1406
  if { { ac_try="$ac_cpp conftest.$ac_ext"
 
1407
case "(($ac_try" in
 
1408
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
1409
  *) ac_try_echo=$ac_try;;
 
1410
esac
 
1411
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
1412
$as_echo "$ac_try_echo"; } >&5
 
1413
  (eval "$ac_cpp conftest.$ac_ext") 2>conftest.err
 
1414
  ac_status=$?
 
1415
  if test -s conftest.err; then
 
1416
    grep -v '^ *+' conftest.err >conftest.er1
 
1417
    cat conftest.er1 >&5
 
1418
    mv -f conftest.er1 conftest.err
 
1419
  fi
 
1420
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
1421
  test $ac_status = 0; } >/dev/null && {
 
1422
         test -z "$ac_c_preproc_warn_flag$ac_c_werror_flag" ||
 
1423
         test ! -s conftest.err
 
1424
       }; then :
 
1425
  ac_retval=0
 
1426
else
 
1427
  $as_echo "$as_me: failed program was:" >&5
 
1428
sed 's/^/| /' conftest.$ac_ext >&5
 
1429
 
 
1430
    ac_retval=1
 
1431
fi
 
1432
  eval $as_lineno_stack; test "x$as_lineno_stack" = x && { as_lineno=; unset as_lineno;}
 
1433
  as_fn_set_status $ac_retval
 
1434
 
 
1435
} # ac_fn_c_try_cpp
 
1436
 
 
1437
# ac_fn_c_check_header_mongrel LINENO HEADER VAR INCLUDES
 
1438
# -------------------------------------------------------
 
1439
# Tests whether HEADER exists, giving a warning if it cannot be compiled using
 
1440
# the include files in INCLUDES and setting the cache variable VAR
 
1441
# accordingly.
 
1442
ac_fn_c_check_header_mongrel ()
 
1443
{
 
1444
  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
 
1445
  if { as_var=$3; eval "test \"\${$as_var+set}\" = set"; }; then :
 
1446
  { $as_echo "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
 
1447
$as_echo_n "checking for $2... " >&6; }
 
1448
if { as_var=$3; eval "test \"\${$as_var+set}\" = set"; }; then :
 
1449
  $as_echo_n "(cached) " >&6
 
1450
fi
 
1451
eval ac_res=\$$3
 
1452
               { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
 
1453
$as_echo "$ac_res" >&6; }
 
1454
else
 
1455
  # Is the header compilable?
 
1456
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking $2 usability" >&5
 
1457
$as_echo_n "checking $2 usability... " >&6; }
 
1458
cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
1459
/* end confdefs.h.  */
 
1460
$4
 
1461
#include <$2>
 
1462
_ACEOF
 
1463
if ac_fn_c_try_compile "$LINENO"; then :
 
1464
  ac_header_compiler=yes
 
1465
else
 
1466
  ac_header_compiler=no
 
1467
fi
 
1468
rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
 
1469
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_header_compiler" >&5
 
1470
$as_echo "$ac_header_compiler" >&6; }
 
1471
 
 
1472
# Is the header present?
 
1473
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking $2 presence" >&5
 
1474
$as_echo_n "checking $2 presence... " >&6; }
 
1475
cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
1476
/* end confdefs.h.  */
 
1477
#include <$2>
 
1478
_ACEOF
 
1479
if ac_fn_c_try_cpp "$LINENO"; then :
 
1480
  ac_header_preproc=yes
 
1481
else
 
1482
  ac_header_preproc=no
 
1483
fi
 
1484
rm -f conftest.err conftest.$ac_ext
 
1485
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_header_preproc" >&5
 
1486
$as_echo "$ac_header_preproc" >&6; }
 
1487
 
 
1488
# So?  What about this header?
 
1489
case $ac_header_compiler:$ac_header_preproc:$ac_c_preproc_warn_flag in #((
 
1490
  yes:no: )
 
1491
    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: accepted by the compiler, rejected by the preprocessor!" >&5
 
1492
$as_echo "$as_me: WARNING: $2: accepted by the compiler, rejected by the preprocessor!" >&2;}
 
1493
    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: proceeding with the compiler's result" >&5
 
1494
$as_echo "$as_me: WARNING: $2: proceeding with the compiler's result" >&2;}
 
1495
    ;;
 
1496
  no:yes:* )
 
1497
    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: present but cannot be compiled" >&5
 
1498
$as_echo "$as_me: WARNING: $2: present but cannot be compiled" >&2;}
 
1499
    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2:     check for missing prerequisite headers?" >&5
 
1500
$as_echo "$as_me: WARNING: $2:     check for missing prerequisite headers?" >&2;}
 
1501
    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: see the Autoconf documentation" >&5
 
1502
$as_echo "$as_me: WARNING: $2: see the Autoconf documentation" >&2;}
 
1503
    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2:     section \"Present But Cannot Be Compiled\"" >&5
 
1504
$as_echo "$as_me: WARNING: $2:     section \"Present But Cannot Be Compiled\"" >&2;}
 
1505
    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: proceeding with the compiler's result" >&5
 
1506
$as_echo "$as_me: WARNING: $2: proceeding with the compiler's result" >&2;}
 
1507
( cat <<\_ASBOX
 
1508
## ------------------------------------ ##
 
1509
## Report this to libraries@haskell.org ##
 
1510
## ------------------------------------ ##
 
1511
_ASBOX
 
1512
     ) | sed "s/^/$as_me: WARNING:     /" >&2
 
1513
    ;;
 
1514
esac
 
1515
  { $as_echo "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
 
1516
$as_echo_n "checking for $2... " >&6; }
 
1517
if { as_var=$3; eval "test \"\${$as_var+set}\" = set"; }; then :
 
1518
  $as_echo_n "(cached) " >&6
 
1519
else
 
1520
  eval "$3=\$ac_header_compiler"
 
1521
fi
 
1522
eval ac_res=\$$3
 
1523
               { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
 
1524
$as_echo "$ac_res" >&6; }
 
1525
fi
 
1526
  eval $as_lineno_stack; test "x$as_lineno_stack" = x && { as_lineno=; unset as_lineno;}
 
1527
 
 
1528
} # ac_fn_c_check_header_mongrel
 
1529
 
 
1530
# ac_fn_c_try_run LINENO
 
1531
# ----------------------
 
1532
# Try to link conftest.$ac_ext, and return whether this succeeded. Assumes
 
1533
# that executables *can* be run.
 
1534
ac_fn_c_try_run ()
 
1535
{
 
1536
  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
 
1537
  if { { ac_try="$ac_link"
 
1538
case "(($ac_try" in
 
1539
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
1540
  *) ac_try_echo=$ac_try;;
 
1541
esac
 
1542
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
1543
$as_echo "$ac_try_echo"; } >&5
 
1544
  (eval "$ac_link") 2>&5
 
1545
  ac_status=$?
 
1546
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
1547
  test $ac_status = 0; } && { ac_try='./conftest$ac_exeext'
 
1548
  { { case "(($ac_try" in
 
1549
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
1550
  *) ac_try_echo=$ac_try;;
 
1551
esac
 
1552
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
1553
$as_echo "$ac_try_echo"; } >&5
 
1554
  (eval "$ac_try") 2>&5
 
1555
  ac_status=$?
 
1556
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
1557
  test $ac_status = 0; }; }; then :
 
1558
  ac_retval=0
 
1559
else
 
1560
  $as_echo "$as_me: program exited with status $ac_status" >&5
 
1561
       $as_echo "$as_me: failed program was:" >&5
 
1562
sed 's/^/| /' conftest.$ac_ext >&5
 
1563
 
 
1564
       ac_retval=$ac_status
 
1565
fi
 
1566
  rm -rf conftest.dSYM conftest_ipa8_conftest.oo
 
1567
  eval $as_lineno_stack; test "x$as_lineno_stack" = x && { as_lineno=; unset as_lineno;}
 
1568
  as_fn_set_status $ac_retval
 
1569
 
 
1570
} # ac_fn_c_try_run
 
1571
 
 
1572
# ac_fn_c_check_header_compile LINENO HEADER VAR INCLUDES
 
1573
# -------------------------------------------------------
 
1574
# Tests whether HEADER exists and can be compiled using the include files in
 
1575
# INCLUDES, setting the cache variable VAR accordingly.
 
1576
ac_fn_c_check_header_compile ()
 
1577
{
 
1578
  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
 
1579
  { $as_echo "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
 
1580
$as_echo_n "checking for $2... " >&6; }
 
1581
if { as_var=$3; eval "test \"\${$as_var+set}\" = set"; }; then :
 
1582
  $as_echo_n "(cached) " >&6
 
1583
else
 
1584
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
1585
/* end confdefs.h.  */
 
1586
$4
 
1587
#include <$2>
 
1588
_ACEOF
 
1589
if ac_fn_c_try_compile "$LINENO"; then :
 
1590
  eval "$3=yes"
 
1591
else
 
1592
  eval "$3=no"
 
1593
fi
 
1594
rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
 
1595
fi
 
1596
eval ac_res=\$$3
 
1597
               { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
 
1598
$as_echo "$ac_res" >&6; }
 
1599
  eval $as_lineno_stack; test "x$as_lineno_stack" = x && { as_lineno=; unset as_lineno;}
 
1600
 
 
1601
} # ac_fn_c_check_header_compile
 
1602
cat >config.log <<_ACEOF
 
1603
This file contains any messages produced by compilers while
 
1604
running configure, to aid debugging if configure makes a mistake.
 
1605
 
 
1606
It was created by Haskell directory package $as_me 1.0, which was
 
1607
generated by GNU Autoconf 2.65.  Invocation command line was
 
1608
 
 
1609
  $ $0 $@
 
1610
 
 
1611
_ACEOF
 
1612
exec 5>>config.log
 
1613
{
 
1614
cat <<_ASUNAME
 
1615
## --------- ##
 
1616
## Platform. ##
 
1617
## --------- ##
 
1618
 
 
1619
hostname = `(hostname || uname -n) 2>/dev/null | sed 1q`
 
1620
uname -m = `(uname -m) 2>/dev/null || echo unknown`
 
1621
uname -r = `(uname -r) 2>/dev/null || echo unknown`
 
1622
uname -s = `(uname -s) 2>/dev/null || echo unknown`
 
1623
uname -v = `(uname -v) 2>/dev/null || echo unknown`
 
1624
 
 
1625
/usr/bin/uname -p = `(/usr/bin/uname -p) 2>/dev/null || echo unknown`
 
1626
/bin/uname -X     = `(/bin/uname -X) 2>/dev/null     || echo unknown`
 
1627
 
 
1628
/bin/arch              = `(/bin/arch) 2>/dev/null              || echo unknown`
 
1629
/usr/bin/arch -k       = `(/usr/bin/arch -k) 2>/dev/null       || echo unknown`
 
1630
/usr/convex/getsysinfo = `(/usr/convex/getsysinfo) 2>/dev/null || echo unknown`
 
1631
/usr/bin/hostinfo      = `(/usr/bin/hostinfo) 2>/dev/null      || echo unknown`
 
1632
/bin/machine           = `(/bin/machine) 2>/dev/null           || echo unknown`
 
1633
/usr/bin/oslevel       = `(/usr/bin/oslevel) 2>/dev/null       || echo unknown`
 
1634
/bin/universe          = `(/bin/universe) 2>/dev/null          || echo unknown`
 
1635
 
 
1636
_ASUNAME
 
1637
 
 
1638
as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
1639
for as_dir in $PATH
 
1640
do
 
1641
  IFS=$as_save_IFS
 
1642
  test -z "$as_dir" && as_dir=.
 
1643
    $as_echo "PATH: $as_dir"
 
1644
  done
 
1645
IFS=$as_save_IFS
 
1646
 
 
1647
} >&5
 
1648
 
 
1649
cat >&5 <<_ACEOF
 
1650
 
 
1651
 
 
1652
## ----------- ##
 
1653
## Core tests. ##
 
1654
## ----------- ##
 
1655
 
 
1656
_ACEOF
 
1657
 
 
1658
 
 
1659
# Keep a trace of the command line.
 
1660
# Strip out --no-create and --no-recursion so they do not pile up.
 
1661
# Strip out --silent because we don't want to record it for future runs.
 
1662
# Also quote any args containing shell meta-characters.
 
1663
# Make two passes to allow for proper duplicate-argument suppression.
 
1664
ac_configure_args=
 
1665
ac_configure_args0=
 
1666
ac_configure_args1=
 
1667
ac_must_keep_next=false
 
1668
for ac_pass in 1 2
 
1669
do
 
1670
  for ac_arg
 
1671
  do
 
1672
    case $ac_arg in
 
1673
    -no-create | --no-c* | -n | -no-recursion | --no-r*) continue ;;
 
1674
    -q | -quiet | --quiet | --quie | --qui | --qu | --q \
 
1675
    | -silent | --silent | --silen | --sile | --sil)
 
1676
      continue ;;
 
1677
    *\'*)
 
1678
      ac_arg=`$as_echo "$ac_arg" | sed "s/'/'\\\\\\\\''/g"` ;;
 
1679
    esac
 
1680
    case $ac_pass in
 
1681
    1) as_fn_append ac_configure_args0 " '$ac_arg'" ;;
 
1682
    2)
 
1683
      as_fn_append ac_configure_args1 " '$ac_arg'"
 
1684
      if test $ac_must_keep_next = true; then
 
1685
        ac_must_keep_next=false # Got value, back to normal.
 
1686
      else
 
1687
        case $ac_arg in
 
1688
          *=* | --config-cache | -C | -disable-* | --disable-* \
 
1689
          | -enable-* | --enable-* | -gas | --g* | -nfp | --nf* \
 
1690
          | -q | -quiet | --q* | -silent | --sil* | -v | -verb* \
 
1691
          | -with-* | --with-* | -without-* | --without-* | --x)
 
1692
            case "$ac_configure_args0 " in
 
1693
              "$ac_configure_args1"*" '$ac_arg' "* ) continue ;;
 
1694
            esac
 
1695
            ;;
 
1696
          -* ) ac_must_keep_next=true ;;
 
1697
        esac
 
1698
      fi
 
1699
      as_fn_append ac_configure_args " '$ac_arg'"
 
1700
      ;;
 
1701
    esac
 
1702
  done
 
1703
done
 
1704
{ ac_configure_args0=; unset ac_configure_args0;}
 
1705
{ ac_configure_args1=; unset ac_configure_args1;}
 
1706
 
 
1707
# When interrupted or exit'd, cleanup temporary files, and complete
 
1708
# config.log.  We remove comments because anyway the quotes in there
 
1709
# would cause problems or look ugly.
 
1710
# WARNING: Use '\'' to represent an apostrophe within the trap.
 
1711
# WARNING: Do not start the trap code with a newline, due to a FreeBSD 4.0 bug.
 
1712
trap 'exit_status=$?
 
1713
  # Save into config.log some information that might help in debugging.
 
1714
  {
 
1715
    echo
 
1716
 
 
1717
    cat <<\_ASBOX
 
1718
## ---------------- ##
 
1719
## Cache variables. ##
 
1720
## ---------------- ##
 
1721
_ASBOX
 
1722
    echo
 
1723
    # The following way of writing the cache mishandles newlines in values,
 
1724
(
 
1725
  for ac_var in `(set) 2>&1 | sed -n '\''s/^\([a-zA-Z_][a-zA-Z0-9_]*\)=.*/\1/p'\''`; do
 
1726
    eval ac_val=\$$ac_var
 
1727
    case $ac_val in #(
 
1728
    *${as_nl}*)
 
1729
      case $ac_var in #(
 
1730
      *_cv_*) { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: cache variable $ac_var contains a newline" >&5
 
1731
$as_echo "$as_me: WARNING: cache variable $ac_var contains a newline" >&2;} ;;
 
1732
      esac
 
1733
      case $ac_var in #(
 
1734
      _ | IFS | as_nl) ;; #(
 
1735
      BASH_ARGV | BASH_SOURCE) eval $ac_var= ;; #(
 
1736
      *) { eval $ac_var=; unset $ac_var;} ;;
 
1737
      esac ;;
 
1738
    esac
 
1739
  done
 
1740
  (set) 2>&1 |
 
1741
    case $as_nl`(ac_space='\'' '\''; set) 2>&1` in #(
 
1742
    *${as_nl}ac_space=\ *)
 
1743
      sed -n \
 
1744
        "s/'\''/'\''\\\\'\'''\''/g;
 
1745
          s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='\''\\2'\''/p"
 
1746
      ;; #(
 
1747
    *)
 
1748
      sed -n "/^[_$as_cr_alnum]*_cv_[_$as_cr_alnum]*=/p"
 
1749
      ;;
 
1750
    esac |
 
1751
    sort
 
1752
)
 
1753
    echo
 
1754
 
 
1755
    cat <<\_ASBOX
 
1756
## ----------------- ##
 
1757
## Output variables. ##
 
1758
## ----------------- ##
 
1759
_ASBOX
 
1760
    echo
 
1761
    for ac_var in $ac_subst_vars
 
1762
    do
 
1763
      eval ac_val=\$$ac_var
 
1764
      case $ac_val in
 
1765
      *\'\''*) ac_val=`$as_echo "$ac_val" | sed "s/'\''/'\''\\\\\\\\'\'''\''/g"`;;
 
1766
      esac
 
1767
      $as_echo "$ac_var='\''$ac_val'\''"
 
1768
    done | sort
 
1769
    echo
 
1770
 
 
1771
    if test -n "$ac_subst_files"; then
 
1772
      cat <<\_ASBOX
 
1773
## ------------------- ##
 
1774
## File substitutions. ##
 
1775
## ------------------- ##
 
1776
_ASBOX
 
1777
      echo
 
1778
      for ac_var in $ac_subst_files
 
1779
      do
 
1780
        eval ac_val=\$$ac_var
 
1781
        case $ac_val in
 
1782
        *\'\''*) ac_val=`$as_echo "$ac_val" | sed "s/'\''/'\''\\\\\\\\'\'''\''/g"`;;
 
1783
        esac
 
1784
        $as_echo "$ac_var='\''$ac_val'\''"
 
1785
      done | sort
 
1786
      echo
 
1787
    fi
 
1788
 
 
1789
    if test -s confdefs.h; then
 
1790
      cat <<\_ASBOX
 
1791
## ----------- ##
 
1792
## confdefs.h. ##
 
1793
## ----------- ##
 
1794
_ASBOX
 
1795
      echo
 
1796
      cat confdefs.h
 
1797
      echo
 
1798
    fi
 
1799
    test "$ac_signal" != 0 &&
 
1800
      $as_echo "$as_me: caught signal $ac_signal"
 
1801
    $as_echo "$as_me: exit $exit_status"
 
1802
  } >&5
 
1803
  rm -f core *.core core.conftest.* &&
 
1804
    rm -f -r conftest* confdefs* conf$$* $ac_clean_files &&
 
1805
    exit $exit_status
 
1806
' 0
 
1807
for ac_signal in 1 2 13 15; do
 
1808
  trap 'ac_signal='$ac_signal'; as_fn_exit 1' $ac_signal
 
1809
done
 
1810
ac_signal=0
 
1811
 
 
1812
# confdefs.h avoids OS command line length limits that DEFS can exceed.
 
1813
rm -f -r conftest* confdefs.h
 
1814
 
 
1815
$as_echo "/* confdefs.h */" > confdefs.h
 
1816
 
 
1817
# Predefined preprocessor variables.
 
1818
 
 
1819
cat >>confdefs.h <<_ACEOF
 
1820
#define PACKAGE_NAME "$PACKAGE_NAME"
 
1821
_ACEOF
 
1822
 
 
1823
cat >>confdefs.h <<_ACEOF
 
1824
#define PACKAGE_TARNAME "$PACKAGE_TARNAME"
 
1825
_ACEOF
 
1826
 
 
1827
cat >>confdefs.h <<_ACEOF
 
1828
#define PACKAGE_VERSION "$PACKAGE_VERSION"
 
1829
_ACEOF
 
1830
 
 
1831
cat >>confdefs.h <<_ACEOF
 
1832
#define PACKAGE_STRING "$PACKAGE_STRING"
 
1833
_ACEOF
 
1834
 
 
1835
cat >>confdefs.h <<_ACEOF
 
1836
#define PACKAGE_BUGREPORT "$PACKAGE_BUGREPORT"
 
1837
_ACEOF
 
1838
 
 
1839
cat >>confdefs.h <<_ACEOF
 
1840
#define PACKAGE_URL "$PACKAGE_URL"
 
1841
_ACEOF
 
1842
 
 
1843
 
 
1844
# Let the site file select an alternate cache file if it wants to.
 
1845
# Prefer an explicitly selected file to automatically selected ones.
 
1846
ac_site_file1=NONE
 
1847
ac_site_file2=NONE
 
1848
if test -n "$CONFIG_SITE"; then
 
1849
  ac_site_file1=$CONFIG_SITE
 
1850
elif test "x$prefix" != xNONE; then
 
1851
  ac_site_file1=$prefix/share/config.site
 
1852
  ac_site_file2=$prefix/etc/config.site
 
1853
else
 
1854
  ac_site_file1=$ac_default_prefix/share/config.site
 
1855
  ac_site_file2=$ac_default_prefix/etc/config.site
 
1856
fi
 
1857
for ac_site_file in "$ac_site_file1" "$ac_site_file2"
 
1858
do
 
1859
  test "x$ac_site_file" = xNONE && continue
 
1860
  if test /dev/null != "$ac_site_file" && test -r "$ac_site_file"; then
 
1861
    { $as_echo "$as_me:${as_lineno-$LINENO}: loading site script $ac_site_file" >&5
 
1862
$as_echo "$as_me: loading site script $ac_site_file" >&6;}
 
1863
    sed 's/^/| /' "$ac_site_file" >&5
 
1864
    . "$ac_site_file"
 
1865
  fi
 
1866
done
 
1867
 
 
1868
if test -r "$cache_file"; then
 
1869
  # Some versions of bash will fail to source /dev/null (special files
 
1870
  # actually), so we avoid doing that.  DJGPP emulates it as a regular file.
 
1871
  if test /dev/null != "$cache_file" && test -f "$cache_file"; then
 
1872
    { $as_echo "$as_me:${as_lineno-$LINENO}: loading cache $cache_file" >&5
 
1873
$as_echo "$as_me: loading cache $cache_file" >&6;}
 
1874
    case $cache_file in
 
1875
      [\\/]* | ?:[\\/]* ) . "$cache_file";;
 
1876
      *)                      . "./$cache_file";;
 
1877
    esac
 
1878
  fi
 
1879
else
 
1880
  { $as_echo "$as_me:${as_lineno-$LINENO}: creating cache $cache_file" >&5
 
1881
$as_echo "$as_me: creating cache $cache_file" >&6;}
 
1882
  >$cache_file
 
1883
fi
 
1884
 
 
1885
# Check that the precious variables saved in the cache have kept the same
 
1886
# value.
 
1887
ac_cache_corrupted=false
 
1888
for ac_var in $ac_precious_vars; do
 
1889
  eval ac_old_set=\$ac_cv_env_${ac_var}_set
 
1890
  eval ac_new_set=\$ac_env_${ac_var}_set
 
1891
  eval ac_old_val=\$ac_cv_env_${ac_var}_value
 
1892
  eval ac_new_val=\$ac_env_${ac_var}_value
 
1893
  case $ac_old_set,$ac_new_set in
 
1894
    set,)
 
1895
      { $as_echo "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&5
 
1896
$as_echo "$as_me: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&2;}
 
1897
      ac_cache_corrupted=: ;;
 
1898
    ,set)
 
1899
      { $as_echo "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' was not set in the previous run" >&5
 
1900
$as_echo "$as_me: error: \`$ac_var' was not set in the previous run" >&2;}
 
1901
      ac_cache_corrupted=: ;;
 
1902
    ,);;
 
1903
    *)
 
1904
      if test "x$ac_old_val" != "x$ac_new_val"; then
 
1905
        # differences in whitespace do not lead to failure.
 
1906
        ac_old_val_w=`echo x $ac_old_val`
 
1907
        ac_new_val_w=`echo x $ac_new_val`
 
1908
        if test "$ac_old_val_w" != "$ac_new_val_w"; then
 
1909
          { $as_echo "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' has changed since the previous run:" >&5
 
1910
$as_echo "$as_me: error: \`$ac_var' has changed since the previous run:" >&2;}
 
1911
          ac_cache_corrupted=:
 
1912
        else
 
1913
          { $as_echo "$as_me:${as_lineno-$LINENO}: warning: ignoring whitespace changes in \`$ac_var' since the previous run:" >&5
 
1914
$as_echo "$as_me: warning: ignoring whitespace changes in \`$ac_var' since the previous run:" >&2;}
 
1915
          eval $ac_var=\$ac_old_val
 
1916
        fi
 
1917
        { $as_echo "$as_me:${as_lineno-$LINENO}:   former value:  \`$ac_old_val'" >&5
 
1918
$as_echo "$as_me:   former value:  \`$ac_old_val'" >&2;}
 
1919
        { $as_echo "$as_me:${as_lineno-$LINENO}:   current value: \`$ac_new_val'" >&5
 
1920
$as_echo "$as_me:   current value: \`$ac_new_val'" >&2;}
 
1921
      fi;;
 
1922
  esac
 
1923
  # Pass precious variables to config.status.
 
1924
  if test "$ac_new_set" = set; then
 
1925
    case $ac_new_val in
 
1926
    *\'*) ac_arg=$ac_var=`$as_echo "$ac_new_val" | sed "s/'/'\\\\\\\\''/g"` ;;
 
1927
    *) ac_arg=$ac_var=$ac_new_val ;;
 
1928
    esac
 
1929
    case " $ac_configure_args " in
 
1930
      *" '$ac_arg' "*) ;; # Avoid dups.  Use of quotes ensures accuracy.
 
1931
      *) as_fn_append ac_configure_args " '$ac_arg'" ;;
 
1932
    esac
 
1933
  fi
 
1934
done
 
1935
if $ac_cache_corrupted; then
 
1936
  { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
 
1937
$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
 
1938
  { $as_echo "$as_me:${as_lineno-$LINENO}: error: changes in the environment can compromise the build" >&5
 
1939
$as_echo "$as_me: error: changes in the environment can compromise the build" >&2;}
 
1940
  as_fn_error "run \`make distclean' and/or \`rm $cache_file' and start over" "$LINENO" 5
 
1941
fi
 
1942
## -------------------- ##
 
1943
## Main body of script. ##
 
1944
## -------------------- ##
 
1945
 
 
1946
ac_ext=c
 
1947
ac_cpp='$CPP $CPPFLAGS'
 
1948
ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
 
1949
ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
 
1950
ac_compiler_gnu=$ac_cv_c_compiler_gnu
 
1951
 
 
1952
 
 
1953
 
 
1954
# Safety check: Ensure that we are in the correct source directory.
 
1955
 
 
1956
 
 
1957
ac_config_headers="$ac_config_headers include/HsDirectoryConfig.h"
 
1958
 
 
1959
 
 
1960
 
 
1961
# Check whether --with-cc was given.
 
1962
if test "${with_cc+set}" = set; then :
 
1963
  withval=$with_cc; CC=$withval
 
1964
fi
 
1965
 
 
1966
ac_ext=c
 
1967
ac_cpp='$CPP $CPPFLAGS'
 
1968
ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
 
1969
ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
 
1970
ac_compiler_gnu=$ac_cv_c_compiler_gnu
 
1971
if test -n "$ac_tool_prefix"; then
 
1972
  # Extract the first word of "${ac_tool_prefix}gcc", so it can be a program name with args.
 
1973
set dummy ${ac_tool_prefix}gcc; ac_word=$2
 
1974
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
 
1975
$as_echo_n "checking for $ac_word... " >&6; }
 
1976
if test "${ac_cv_prog_CC+set}" = set; then :
 
1977
  $as_echo_n "(cached) " >&6
 
1978
else
 
1979
  if test -n "$CC"; then
 
1980
  ac_cv_prog_CC="$CC" # Let the user override the test.
 
1981
else
 
1982
as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
1983
for as_dir in $PATH
 
1984
do
 
1985
  IFS=$as_save_IFS
 
1986
  test -z "$as_dir" && as_dir=.
 
1987
    for ac_exec_ext in '' $ac_executable_extensions; do
 
1988
  if { test -f "$as_dir/$ac_word$ac_exec_ext" && $as_test_x "$as_dir/$ac_word$ac_exec_ext"; }; then
 
1989
    ac_cv_prog_CC="${ac_tool_prefix}gcc"
 
1990
    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
 
1991
    break 2
 
1992
  fi
 
1993
done
 
1994
  done
 
1995
IFS=$as_save_IFS
 
1996
 
 
1997
fi
 
1998
fi
 
1999
CC=$ac_cv_prog_CC
 
2000
if test -n "$CC"; then
 
2001
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
 
2002
$as_echo "$CC" >&6; }
 
2003
else
 
2004
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
 
2005
$as_echo "no" >&6; }
 
2006
fi
 
2007
 
 
2008
 
 
2009
fi
 
2010
if test -z "$ac_cv_prog_CC"; then
 
2011
  ac_ct_CC=$CC
 
2012
  # Extract the first word of "gcc", so it can be a program name with args.
 
2013
set dummy gcc; ac_word=$2
 
2014
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
 
2015
$as_echo_n "checking for $ac_word... " >&6; }
 
2016
if test "${ac_cv_prog_ac_ct_CC+set}" = set; then :
 
2017
  $as_echo_n "(cached) " >&6
 
2018
else
 
2019
  if test -n "$ac_ct_CC"; then
 
2020
  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
 
2021
else
 
2022
as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
2023
for as_dir in $PATH
 
2024
do
 
2025
  IFS=$as_save_IFS
 
2026
  test -z "$as_dir" && as_dir=.
 
2027
    for ac_exec_ext in '' $ac_executable_extensions; do
 
2028
  if { test -f "$as_dir/$ac_word$ac_exec_ext" && $as_test_x "$as_dir/$ac_word$ac_exec_ext"; }; then
 
2029
    ac_cv_prog_ac_ct_CC="gcc"
 
2030
    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
 
2031
    break 2
 
2032
  fi
 
2033
done
 
2034
  done
 
2035
IFS=$as_save_IFS
 
2036
 
 
2037
fi
 
2038
fi
 
2039
ac_ct_CC=$ac_cv_prog_ac_ct_CC
 
2040
if test -n "$ac_ct_CC"; then
 
2041
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
 
2042
$as_echo "$ac_ct_CC" >&6; }
 
2043
else
 
2044
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
 
2045
$as_echo "no" >&6; }
 
2046
fi
 
2047
 
 
2048
  if test "x$ac_ct_CC" = x; then
 
2049
    CC=""
 
2050
  else
 
2051
    case $cross_compiling:$ac_tool_warned in
 
2052
yes:)
 
2053
{ $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
 
2054
$as_echo "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
 
2055
ac_tool_warned=yes ;;
 
2056
esac
 
2057
    CC=$ac_ct_CC
 
2058
  fi
 
2059
else
 
2060
  CC="$ac_cv_prog_CC"
 
2061
fi
 
2062
 
 
2063
if test -z "$CC"; then
 
2064
          if test -n "$ac_tool_prefix"; then
 
2065
    # Extract the first word of "${ac_tool_prefix}cc", so it can be a program name with args.
 
2066
set dummy ${ac_tool_prefix}cc; ac_word=$2
 
2067
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
 
2068
$as_echo_n "checking for $ac_word... " >&6; }
 
2069
if test "${ac_cv_prog_CC+set}" = set; then :
 
2070
  $as_echo_n "(cached) " >&6
 
2071
else
 
2072
  if test -n "$CC"; then
 
2073
  ac_cv_prog_CC="$CC" # Let the user override the test.
 
2074
else
 
2075
as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
2076
for as_dir in $PATH
 
2077
do
 
2078
  IFS=$as_save_IFS
 
2079
  test -z "$as_dir" && as_dir=.
 
2080
    for ac_exec_ext in '' $ac_executable_extensions; do
 
2081
  if { test -f "$as_dir/$ac_word$ac_exec_ext" && $as_test_x "$as_dir/$ac_word$ac_exec_ext"; }; then
 
2082
    ac_cv_prog_CC="${ac_tool_prefix}cc"
 
2083
    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
 
2084
    break 2
 
2085
  fi
 
2086
done
 
2087
  done
 
2088
IFS=$as_save_IFS
 
2089
 
 
2090
fi
 
2091
fi
 
2092
CC=$ac_cv_prog_CC
 
2093
if test -n "$CC"; then
 
2094
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
 
2095
$as_echo "$CC" >&6; }
 
2096
else
 
2097
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
 
2098
$as_echo "no" >&6; }
 
2099
fi
 
2100
 
 
2101
 
 
2102
  fi
 
2103
fi
 
2104
if test -z "$CC"; then
 
2105
  # Extract the first word of "cc", so it can be a program name with args.
 
2106
set dummy cc; ac_word=$2
 
2107
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
 
2108
$as_echo_n "checking for $ac_word... " >&6; }
 
2109
if test "${ac_cv_prog_CC+set}" = set; then :
 
2110
  $as_echo_n "(cached) " >&6
 
2111
else
 
2112
  if test -n "$CC"; then
 
2113
  ac_cv_prog_CC="$CC" # Let the user override the test.
 
2114
else
 
2115
  ac_prog_rejected=no
 
2116
as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
2117
for as_dir in $PATH
 
2118
do
 
2119
  IFS=$as_save_IFS
 
2120
  test -z "$as_dir" && as_dir=.
 
2121
    for ac_exec_ext in '' $ac_executable_extensions; do
 
2122
  if { test -f "$as_dir/$ac_word$ac_exec_ext" && $as_test_x "$as_dir/$ac_word$ac_exec_ext"; }; then
 
2123
    if test "$as_dir/$ac_word$ac_exec_ext" = "/usr/ucb/cc"; then
 
2124
       ac_prog_rejected=yes
 
2125
       continue
 
2126
     fi
 
2127
    ac_cv_prog_CC="cc"
 
2128
    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
 
2129
    break 2
 
2130
  fi
 
2131
done
 
2132
  done
 
2133
IFS=$as_save_IFS
 
2134
 
 
2135
if test $ac_prog_rejected = yes; then
 
2136
  # We found a bogon in the path, so make sure we never use it.
 
2137
  set dummy $ac_cv_prog_CC
 
2138
  shift
 
2139
  if test $# != 0; then
 
2140
    # We chose a different compiler from the bogus one.
 
2141
    # However, it has the same basename, so the bogon will be chosen
 
2142
    # first if we set CC to just the basename; use the full file name.
 
2143
    shift
 
2144
    ac_cv_prog_CC="$as_dir/$ac_word${1+' '}$@"
 
2145
  fi
 
2146
fi
 
2147
fi
 
2148
fi
 
2149
CC=$ac_cv_prog_CC
 
2150
if test -n "$CC"; then
 
2151
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
 
2152
$as_echo "$CC" >&6; }
 
2153
else
 
2154
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
 
2155
$as_echo "no" >&6; }
 
2156
fi
 
2157
 
 
2158
 
 
2159
fi
 
2160
if test -z "$CC"; then
 
2161
  if test -n "$ac_tool_prefix"; then
 
2162
  for ac_prog in cl.exe
 
2163
  do
 
2164
    # Extract the first word of "$ac_tool_prefix$ac_prog", so it can be a program name with args.
 
2165
set dummy $ac_tool_prefix$ac_prog; ac_word=$2
 
2166
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
 
2167
$as_echo_n "checking for $ac_word... " >&6; }
 
2168
if test "${ac_cv_prog_CC+set}" = set; then :
 
2169
  $as_echo_n "(cached) " >&6
 
2170
else
 
2171
  if test -n "$CC"; then
 
2172
  ac_cv_prog_CC="$CC" # Let the user override the test.
 
2173
else
 
2174
as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
2175
for as_dir in $PATH
 
2176
do
 
2177
  IFS=$as_save_IFS
 
2178
  test -z "$as_dir" && as_dir=.
 
2179
    for ac_exec_ext in '' $ac_executable_extensions; do
 
2180
  if { test -f "$as_dir/$ac_word$ac_exec_ext" && $as_test_x "$as_dir/$ac_word$ac_exec_ext"; }; then
 
2181
    ac_cv_prog_CC="$ac_tool_prefix$ac_prog"
 
2182
    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
 
2183
    break 2
 
2184
  fi
 
2185
done
 
2186
  done
 
2187
IFS=$as_save_IFS
 
2188
 
 
2189
fi
 
2190
fi
 
2191
CC=$ac_cv_prog_CC
 
2192
if test -n "$CC"; then
 
2193
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
 
2194
$as_echo "$CC" >&6; }
 
2195
else
 
2196
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
 
2197
$as_echo "no" >&6; }
 
2198
fi
 
2199
 
 
2200
 
 
2201
    test -n "$CC" && break
 
2202
  done
 
2203
fi
 
2204
if test -z "$CC"; then
 
2205
  ac_ct_CC=$CC
 
2206
  for ac_prog in cl.exe
 
2207
do
 
2208
  # Extract the first word of "$ac_prog", so it can be a program name with args.
 
2209
set dummy $ac_prog; ac_word=$2
 
2210
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
 
2211
$as_echo_n "checking for $ac_word... " >&6; }
 
2212
if test "${ac_cv_prog_ac_ct_CC+set}" = set; then :
 
2213
  $as_echo_n "(cached) " >&6
 
2214
else
 
2215
  if test -n "$ac_ct_CC"; then
 
2216
  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
 
2217
else
 
2218
as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
2219
for as_dir in $PATH
 
2220
do
 
2221
  IFS=$as_save_IFS
 
2222
  test -z "$as_dir" && as_dir=.
 
2223
    for ac_exec_ext in '' $ac_executable_extensions; do
 
2224
  if { test -f "$as_dir/$ac_word$ac_exec_ext" && $as_test_x "$as_dir/$ac_word$ac_exec_ext"; }; then
 
2225
    ac_cv_prog_ac_ct_CC="$ac_prog"
 
2226
    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
 
2227
    break 2
 
2228
  fi
 
2229
done
 
2230
  done
 
2231
IFS=$as_save_IFS
 
2232
 
 
2233
fi
 
2234
fi
 
2235
ac_ct_CC=$ac_cv_prog_ac_ct_CC
 
2236
if test -n "$ac_ct_CC"; then
 
2237
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
 
2238
$as_echo "$ac_ct_CC" >&6; }
 
2239
else
 
2240
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
 
2241
$as_echo "no" >&6; }
 
2242
fi
 
2243
 
 
2244
 
 
2245
  test -n "$ac_ct_CC" && break
 
2246
done
 
2247
 
 
2248
  if test "x$ac_ct_CC" = x; then
 
2249
    CC=""
 
2250
  else
 
2251
    case $cross_compiling:$ac_tool_warned in
 
2252
yes:)
 
2253
{ $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
 
2254
$as_echo "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
 
2255
ac_tool_warned=yes ;;
 
2256
esac
 
2257
    CC=$ac_ct_CC
 
2258
  fi
 
2259
fi
 
2260
 
 
2261
fi
 
2262
 
 
2263
 
 
2264
test -z "$CC" && { { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
 
2265
$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
 
2266
as_fn_error "no acceptable C compiler found in \$PATH
 
2267
See \`config.log' for more details." "$LINENO" 5; }
 
2268
 
 
2269
# Provide some information about the compiler.
 
2270
$as_echo "$as_me:${as_lineno-$LINENO}: checking for C compiler version" >&5
 
2271
set X $ac_compile
 
2272
ac_compiler=$2
 
2273
for ac_option in --version -v -V -qversion; do
 
2274
  { { ac_try="$ac_compiler $ac_option >&5"
 
2275
case "(($ac_try" in
 
2276
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
2277
  *) ac_try_echo=$ac_try;;
 
2278
esac
 
2279
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
2280
$as_echo "$ac_try_echo"; } >&5
 
2281
  (eval "$ac_compiler $ac_option >&5") 2>conftest.err
 
2282
  ac_status=$?
 
2283
  if test -s conftest.err; then
 
2284
    sed '10a\
 
2285
... rest of stderr output deleted ...
 
2286
         10q' conftest.err >conftest.er1
 
2287
    cat conftest.er1 >&5
 
2288
  fi
 
2289
  rm -f conftest.er1 conftest.err
 
2290
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
2291
  test $ac_status = 0; }
 
2292
done
 
2293
 
 
2294
cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2295
/* end confdefs.h.  */
 
2296
 
 
2297
int
 
2298
main ()
 
2299
{
 
2300
 
 
2301
  ;
 
2302
  return 0;
 
2303
}
 
2304
_ACEOF
 
2305
ac_clean_files_save=$ac_clean_files
 
2306
ac_clean_files="$ac_clean_files a.out a.out.dSYM a.exe b.out"
 
2307
# Try to create an executable without -o first, disregard a.out.
 
2308
# It will help us diagnose broken compilers, and finding out an intuition
 
2309
# of exeext.
 
2310
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking whether the C compiler works" >&5
 
2311
$as_echo_n "checking whether the C compiler works... " >&6; }
 
2312
ac_link_default=`$as_echo "$ac_link" | sed 's/ -o *conftest[^ ]*//'`
 
2313
 
 
2314
# The possible output files:
 
2315
ac_files="a.out conftest.exe conftest a.exe a_out.exe b.out conftest.*"
 
2316
 
 
2317
ac_rmfiles=
 
2318
for ac_file in $ac_files
 
2319
do
 
2320
  case $ac_file in
 
2321
    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj ) ;;
 
2322
    * ) ac_rmfiles="$ac_rmfiles $ac_file";;
 
2323
  esac
 
2324
done
 
2325
rm -f $ac_rmfiles
 
2326
 
 
2327
if { { ac_try="$ac_link_default"
 
2328
case "(($ac_try" in
 
2329
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
2330
  *) ac_try_echo=$ac_try;;
 
2331
esac
 
2332
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
2333
$as_echo "$ac_try_echo"; } >&5
 
2334
  (eval "$ac_link_default") 2>&5
 
2335
  ac_status=$?
 
2336
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
2337
  test $ac_status = 0; }; then :
 
2338
  # Autoconf-2.13 could set the ac_cv_exeext variable to `no'.
 
2339
# So ignore a value of `no', otherwise this would lead to `EXEEXT = no'
 
2340
# in a Makefile.  We should not override ac_cv_exeext if it was cached,
 
2341
# so that the user can short-circuit this test for compilers unknown to
 
2342
# Autoconf.
 
2343
for ac_file in $ac_files ''
 
2344
do
 
2345
  test -f "$ac_file" || continue
 
2346
  case $ac_file in
 
2347
    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj )
 
2348
        ;;
 
2349
    [ab].out )
 
2350
        # We found the default executable, but exeext='' is most
 
2351
        # certainly right.
 
2352
        break;;
 
2353
    *.* )
 
2354
        if test "${ac_cv_exeext+set}" = set && test "$ac_cv_exeext" != no;
 
2355
        then :; else
 
2356
           ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
 
2357
        fi
 
2358
        # We set ac_cv_exeext here because the later test for it is not
 
2359
        # safe: cross compilers may not add the suffix if given an `-o'
 
2360
        # argument, so we may need to know it at that point already.
 
2361
        # Even if this section looks crufty: it has the advantage of
 
2362
        # actually working.
 
2363
        break;;
 
2364
    * )
 
2365
        break;;
 
2366
  esac
 
2367
done
 
2368
test "$ac_cv_exeext" = no && ac_cv_exeext=
 
2369
 
 
2370
else
 
2371
  ac_file=''
 
2372
fi
 
2373
if test -z "$ac_file"; then :
 
2374
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
 
2375
$as_echo "no" >&6; }
 
2376
$as_echo "$as_me: failed program was:" >&5
 
2377
sed 's/^/| /' conftest.$ac_ext >&5
 
2378
 
 
2379
{ { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
 
2380
$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
 
2381
{ as_fn_set_status 77
 
2382
as_fn_error "C compiler cannot create executables
 
2383
See \`config.log' for more details." "$LINENO" 5; }; }
 
2384
else
 
2385
  { $as_echo "$as_me:${as_lineno-$LINENO}: result: yes" >&5
 
2386
$as_echo "yes" >&6; }
 
2387
fi
 
2388
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for C compiler default output file name" >&5
 
2389
$as_echo_n "checking for C compiler default output file name... " >&6; }
 
2390
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_file" >&5
 
2391
$as_echo "$ac_file" >&6; }
 
2392
ac_exeext=$ac_cv_exeext
 
2393
 
 
2394
rm -f -r a.out a.out.dSYM a.exe conftest$ac_cv_exeext b.out
 
2395
ac_clean_files=$ac_clean_files_save
 
2396
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for suffix of executables" >&5
 
2397
$as_echo_n "checking for suffix of executables... " >&6; }
 
2398
if { { ac_try="$ac_link"
 
2399
case "(($ac_try" in
 
2400
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
2401
  *) ac_try_echo=$ac_try;;
 
2402
esac
 
2403
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
2404
$as_echo "$ac_try_echo"; } >&5
 
2405
  (eval "$ac_link") 2>&5
 
2406
  ac_status=$?
 
2407
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
2408
  test $ac_status = 0; }; then :
 
2409
  # If both `conftest.exe' and `conftest' are `present' (well, observable)
 
2410
# catch `conftest.exe'.  For instance with Cygwin, `ls conftest' will
 
2411
# work properly (i.e., refer to `conftest.exe'), while it won't with
 
2412
# `rm'.
 
2413
for ac_file in conftest.exe conftest conftest.*; do
 
2414
  test -f "$ac_file" || continue
 
2415
  case $ac_file in
 
2416
    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj ) ;;
 
2417
    *.* ) ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
 
2418
          break;;
 
2419
    * ) break;;
 
2420
  esac
 
2421
done
 
2422
else
 
2423
  { { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
 
2424
$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
 
2425
as_fn_error "cannot compute suffix of executables: cannot compile and link
 
2426
See \`config.log' for more details." "$LINENO" 5; }
 
2427
fi
 
2428
rm -f conftest conftest$ac_cv_exeext
 
2429
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_exeext" >&5
 
2430
$as_echo "$ac_cv_exeext" >&6; }
 
2431
 
 
2432
rm -f conftest.$ac_ext
 
2433
EXEEXT=$ac_cv_exeext
 
2434
ac_exeext=$EXEEXT
 
2435
cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2436
/* end confdefs.h.  */
 
2437
#include <stdio.h>
 
2438
int
 
2439
main ()
 
2440
{
 
2441
FILE *f = fopen ("conftest.out", "w");
 
2442
 return ferror (f) || fclose (f) != 0;
 
2443
 
 
2444
  ;
 
2445
  return 0;
 
2446
}
 
2447
_ACEOF
 
2448
ac_clean_files="$ac_clean_files conftest.out"
 
2449
# Check that the compiler produces executables we can run.  If not, either
 
2450
# the compiler is broken, or we cross compile.
 
2451
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking whether we are cross compiling" >&5
 
2452
$as_echo_n "checking whether we are cross compiling... " >&6; }
 
2453
if test "$cross_compiling" != yes; then
 
2454
  { { ac_try="$ac_link"
 
2455
case "(($ac_try" in
 
2456
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
2457
  *) ac_try_echo=$ac_try;;
 
2458
esac
 
2459
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
2460
$as_echo "$ac_try_echo"; } >&5
 
2461
  (eval "$ac_link") 2>&5
 
2462
  ac_status=$?
 
2463
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
2464
  test $ac_status = 0; }
 
2465
  if { ac_try='./conftest$ac_cv_exeext'
 
2466
  { { case "(($ac_try" in
 
2467
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
2468
  *) ac_try_echo=$ac_try;;
 
2469
esac
 
2470
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
2471
$as_echo "$ac_try_echo"; } >&5
 
2472
  (eval "$ac_try") 2>&5
 
2473
  ac_status=$?
 
2474
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
2475
  test $ac_status = 0; }; }; then
 
2476
    cross_compiling=no
 
2477
  else
 
2478
    if test "$cross_compiling" = maybe; then
 
2479
        cross_compiling=yes
 
2480
    else
 
2481
        { { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
 
2482
$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
 
2483
as_fn_error "cannot run C compiled programs.
 
2484
If you meant to cross compile, use \`--host'.
 
2485
See \`config.log' for more details." "$LINENO" 5; }
 
2486
    fi
 
2487
  fi
 
2488
fi
 
2489
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $cross_compiling" >&5
 
2490
$as_echo "$cross_compiling" >&6; }
 
2491
 
 
2492
rm -f conftest.$ac_ext conftest$ac_cv_exeext conftest.out
 
2493
ac_clean_files=$ac_clean_files_save
 
2494
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for suffix of object files" >&5
 
2495
$as_echo_n "checking for suffix of object files... " >&6; }
 
2496
if test "${ac_cv_objext+set}" = set; then :
 
2497
  $as_echo_n "(cached) " >&6
 
2498
else
 
2499
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2500
/* end confdefs.h.  */
 
2501
 
 
2502
int
 
2503
main ()
 
2504
{
 
2505
 
 
2506
  ;
 
2507
  return 0;
 
2508
}
 
2509
_ACEOF
 
2510
rm -f conftest.o conftest.obj
 
2511
if { { ac_try="$ac_compile"
 
2512
case "(($ac_try" in
 
2513
  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
 
2514
  *) ac_try_echo=$ac_try;;
 
2515
esac
 
2516
eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
 
2517
$as_echo "$ac_try_echo"; } >&5
 
2518
  (eval "$ac_compile") 2>&5
 
2519
  ac_status=$?
 
2520
  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
 
2521
  test $ac_status = 0; }; then :
 
2522
  for ac_file in conftest.o conftest.obj conftest.*; do
 
2523
  test -f "$ac_file" || continue;
 
2524
  case $ac_file in
 
2525
    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM ) ;;
 
2526
    *) ac_cv_objext=`expr "$ac_file" : '.*\.\(.*\)'`
 
2527
       break;;
 
2528
  esac
 
2529
done
 
2530
else
 
2531
  $as_echo "$as_me: failed program was:" >&5
 
2532
sed 's/^/| /' conftest.$ac_ext >&5
 
2533
 
 
2534
{ { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
 
2535
$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
 
2536
as_fn_error "cannot compute suffix of object files: cannot compile
 
2537
See \`config.log' for more details." "$LINENO" 5; }
 
2538
fi
 
2539
rm -f conftest.$ac_cv_objext conftest.$ac_ext
 
2540
fi
 
2541
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_objext" >&5
 
2542
$as_echo "$ac_cv_objext" >&6; }
 
2543
OBJEXT=$ac_cv_objext
 
2544
ac_objext=$OBJEXT
 
2545
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking whether we are using the GNU C compiler" >&5
 
2546
$as_echo_n "checking whether we are using the GNU C compiler... " >&6; }
 
2547
if test "${ac_cv_c_compiler_gnu+set}" = set; then :
 
2548
  $as_echo_n "(cached) " >&6
 
2549
else
 
2550
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2551
/* end confdefs.h.  */
 
2552
 
 
2553
int
 
2554
main ()
 
2555
{
 
2556
#ifndef __GNUC__
 
2557
       choke me
 
2558
#endif
 
2559
 
 
2560
  ;
 
2561
  return 0;
 
2562
}
 
2563
_ACEOF
 
2564
if ac_fn_c_try_compile "$LINENO"; then :
 
2565
  ac_compiler_gnu=yes
 
2566
else
 
2567
  ac_compiler_gnu=no
 
2568
fi
 
2569
rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
 
2570
ac_cv_c_compiler_gnu=$ac_compiler_gnu
 
2571
 
 
2572
fi
 
2573
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_c_compiler_gnu" >&5
 
2574
$as_echo "$ac_cv_c_compiler_gnu" >&6; }
 
2575
if test $ac_compiler_gnu = yes; then
 
2576
  GCC=yes
 
2577
else
 
2578
  GCC=
 
2579
fi
 
2580
ac_test_CFLAGS=${CFLAGS+set}
 
2581
ac_save_CFLAGS=$CFLAGS
 
2582
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking whether $CC accepts -g" >&5
 
2583
$as_echo_n "checking whether $CC accepts -g... " >&6; }
 
2584
if test "${ac_cv_prog_cc_g+set}" = set; then :
 
2585
  $as_echo_n "(cached) " >&6
 
2586
else
 
2587
  ac_save_c_werror_flag=$ac_c_werror_flag
 
2588
   ac_c_werror_flag=yes
 
2589
   ac_cv_prog_cc_g=no
 
2590
   CFLAGS="-g"
 
2591
   cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2592
/* end confdefs.h.  */
 
2593
 
 
2594
int
 
2595
main ()
 
2596
{
 
2597
 
 
2598
  ;
 
2599
  return 0;
 
2600
}
 
2601
_ACEOF
 
2602
if ac_fn_c_try_compile "$LINENO"; then :
 
2603
  ac_cv_prog_cc_g=yes
 
2604
else
 
2605
  CFLAGS=""
 
2606
      cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2607
/* end confdefs.h.  */
 
2608
 
 
2609
int
 
2610
main ()
 
2611
{
 
2612
 
 
2613
  ;
 
2614
  return 0;
 
2615
}
 
2616
_ACEOF
 
2617
if ac_fn_c_try_compile "$LINENO"; then :
 
2618
 
 
2619
else
 
2620
  ac_c_werror_flag=$ac_save_c_werror_flag
 
2621
         CFLAGS="-g"
 
2622
         cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2623
/* end confdefs.h.  */
 
2624
 
 
2625
int
 
2626
main ()
 
2627
{
 
2628
 
 
2629
  ;
 
2630
  return 0;
 
2631
}
 
2632
_ACEOF
 
2633
if ac_fn_c_try_compile "$LINENO"; then :
 
2634
  ac_cv_prog_cc_g=yes
 
2635
fi
 
2636
rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
 
2637
fi
 
2638
rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
 
2639
fi
 
2640
rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
 
2641
   ac_c_werror_flag=$ac_save_c_werror_flag
 
2642
fi
 
2643
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_g" >&5
 
2644
$as_echo "$ac_cv_prog_cc_g" >&6; }
 
2645
if test "$ac_test_CFLAGS" = set; then
 
2646
  CFLAGS=$ac_save_CFLAGS
 
2647
elif test $ac_cv_prog_cc_g = yes; then
 
2648
  if test "$GCC" = yes; then
 
2649
    CFLAGS="-g -O2"
 
2650
  else
 
2651
    CFLAGS="-g"
 
2652
  fi
 
2653
else
 
2654
  if test "$GCC" = yes; then
 
2655
    CFLAGS="-O2"
 
2656
  else
 
2657
    CFLAGS=
 
2658
  fi
 
2659
fi
 
2660
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $CC option to accept ISO C89" >&5
 
2661
$as_echo_n "checking for $CC option to accept ISO C89... " >&6; }
 
2662
if test "${ac_cv_prog_cc_c89+set}" = set; then :
 
2663
  $as_echo_n "(cached) " >&6
 
2664
else
 
2665
  ac_cv_prog_cc_c89=no
 
2666
ac_save_CC=$CC
 
2667
cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2668
/* end confdefs.h.  */
 
2669
#include <stdarg.h>
 
2670
#include <stdio.h>
 
2671
#include <sys/types.h>
 
2672
#include <sys/stat.h>
 
2673
/* Most of the following tests are stolen from RCS 5.7's src/conf.sh.  */
 
2674
struct buf { int x; };
 
2675
FILE * (*rcsopen) (struct buf *, struct stat *, int);
 
2676
static char *e (p, i)
 
2677
     char **p;
 
2678
     int i;
 
2679
{
 
2680
  return p[i];
 
2681
}
 
2682
static char *f (char * (*g) (char **, int), char **p, ...)
 
2683
{
 
2684
  char *s;
 
2685
  va_list v;
 
2686
  va_start (v,p);
 
2687
  s = g (p, va_arg (v,int));
 
2688
  va_end (v);
 
2689
  return s;
 
2690
}
 
2691
 
 
2692
/* OSF 4.0 Compaq cc is some sort of almost-ANSI by default.  It has
 
2693
   function prototypes and stuff, but not '\xHH' hex character constants.
 
2694
   These don't provoke an error unfortunately, instead are silently treated
 
2695
   as 'x'.  The following induces an error, until -std is added to get
 
2696
   proper ANSI mode.  Curiously '\x00'!='x' always comes out true, for an
 
2697
   array size at least.  It's necessary to write '\x00'==0 to get something
 
2698
   that's true only with -std.  */
 
2699
int osf4_cc_array ['\x00' == 0 ? 1 : -1];
 
2700
 
 
2701
/* IBM C 6 for AIX is almost-ANSI by default, but it replaces macro parameters
 
2702
   inside strings and character constants.  */
 
2703
#define FOO(x) 'x'
 
2704
int xlc6_cc_array[FOO(a) == 'x' ? 1 : -1];
 
2705
 
 
2706
int test (int i, double x);
 
2707
struct s1 {int (*f) (int a);};
 
2708
struct s2 {int (*f) (double a);};
 
2709
int pairnames (int, char **, FILE *(*)(struct buf *, struct stat *, int), int, int);
 
2710
int argc;
 
2711
char **argv;
 
2712
int
 
2713
main ()
 
2714
{
 
2715
return f (e, argv, 0) != argv[0]  ||  f (e, argv, 1) != argv[1];
 
2716
  ;
 
2717
  return 0;
 
2718
}
 
2719
_ACEOF
 
2720
for ac_arg in '' -qlanglvl=extc89 -qlanglvl=ansi -std \
 
2721
        -Ae "-Aa -D_HPUX_SOURCE" "-Xc -D__EXTENSIONS__"
 
2722
do
 
2723
  CC="$ac_save_CC $ac_arg"
 
2724
  if ac_fn_c_try_compile "$LINENO"; then :
 
2725
  ac_cv_prog_cc_c89=$ac_arg
 
2726
fi
 
2727
rm -f core conftest.err conftest.$ac_objext
 
2728
  test "x$ac_cv_prog_cc_c89" != "xno" && break
 
2729
done
 
2730
rm -f conftest.$ac_ext
 
2731
CC=$ac_save_CC
 
2732
 
 
2733
fi
 
2734
# AC_CACHE_VAL
 
2735
case "x$ac_cv_prog_cc_c89" in
 
2736
  x)
 
2737
    { $as_echo "$as_me:${as_lineno-$LINENO}: result: none needed" >&5
 
2738
$as_echo "none needed" >&6; } ;;
 
2739
  xno)
 
2740
    { $as_echo "$as_me:${as_lineno-$LINENO}: result: unsupported" >&5
 
2741
$as_echo "unsupported" >&6; } ;;
 
2742
  *)
 
2743
    CC="$CC $ac_cv_prog_cc_c89"
 
2744
    { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_c89" >&5
 
2745
$as_echo "$ac_cv_prog_cc_c89" >&6; } ;;
 
2746
esac
 
2747
if test "x$ac_cv_prog_cc_c89" != xno; then :
 
2748
 
 
2749
fi
 
2750
 
 
2751
ac_ext=c
 
2752
ac_cpp='$CPP $CPPFLAGS'
 
2753
ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
 
2754
ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
 
2755
ac_compiler_gnu=$ac_cv_c_compiler_gnu
 
2756
 
 
2757
 
 
2758
# check for specific header (.h) files that we are interested in
 
2759
 
 
2760
ac_ext=c
 
2761
ac_cpp='$CPP $CPPFLAGS'
 
2762
ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
 
2763
ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
 
2764
ac_compiler_gnu=$ac_cv_c_compiler_gnu
 
2765
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking how to run the C preprocessor" >&5
 
2766
$as_echo_n "checking how to run the C preprocessor... " >&6; }
 
2767
# On Suns, sometimes $CPP names a directory.
 
2768
if test -n "$CPP" && test -d "$CPP"; then
 
2769
  CPP=
 
2770
fi
 
2771
if test -z "$CPP"; then
 
2772
  if test "${ac_cv_prog_CPP+set}" = set; then :
 
2773
  $as_echo_n "(cached) " >&6
 
2774
else
 
2775
      # Double quotes because CPP needs to be expanded
 
2776
    for CPP in "$CC -E" "$CC -E -traditional-cpp" "/lib/cpp"
 
2777
    do
 
2778
      ac_preproc_ok=false
 
2779
for ac_c_preproc_warn_flag in '' yes
 
2780
do
 
2781
  # Use a header file that comes with gcc, so configuring glibc
 
2782
  # with a fresh cross-compiler works.
 
2783
  # Prefer <limits.h> to <assert.h> if __STDC__ is defined, since
 
2784
  # <limits.h> exists even on freestanding compilers.
 
2785
  # On the NeXT, cc -E runs the code through the compiler's parser,
 
2786
  # not just through cpp. "Syntax error" is here to catch this case.
 
2787
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2788
/* end confdefs.h.  */
 
2789
#ifdef __STDC__
 
2790
# include <limits.h>
 
2791
#else
 
2792
# include <assert.h>
 
2793
#endif
 
2794
                     Syntax error
 
2795
_ACEOF
 
2796
if ac_fn_c_try_cpp "$LINENO"; then :
 
2797
 
 
2798
else
 
2799
  # Broken: fails on valid input.
 
2800
continue
 
2801
fi
 
2802
rm -f conftest.err conftest.$ac_ext
 
2803
 
 
2804
  # OK, works on sane cases.  Now check whether nonexistent headers
 
2805
  # can be detected and how.
 
2806
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2807
/* end confdefs.h.  */
 
2808
#include <ac_nonexistent.h>
 
2809
_ACEOF
 
2810
if ac_fn_c_try_cpp "$LINENO"; then :
 
2811
  # Broken: success on invalid input.
 
2812
continue
 
2813
else
 
2814
  # Passes both tests.
 
2815
ac_preproc_ok=:
 
2816
break
 
2817
fi
 
2818
rm -f conftest.err conftest.$ac_ext
 
2819
 
 
2820
done
 
2821
# Because of `break', _AC_PREPROC_IFELSE's cleaning code was skipped.
 
2822
rm -f conftest.err conftest.$ac_ext
 
2823
if $ac_preproc_ok; then :
 
2824
  break
 
2825
fi
 
2826
 
 
2827
    done
 
2828
    ac_cv_prog_CPP=$CPP
 
2829
 
 
2830
fi
 
2831
  CPP=$ac_cv_prog_CPP
 
2832
else
 
2833
  ac_cv_prog_CPP=$CPP
 
2834
fi
 
2835
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $CPP" >&5
 
2836
$as_echo "$CPP" >&6; }
 
2837
ac_preproc_ok=false
 
2838
for ac_c_preproc_warn_flag in '' yes
 
2839
do
 
2840
  # Use a header file that comes with gcc, so configuring glibc
 
2841
  # with a fresh cross-compiler works.
 
2842
  # Prefer <limits.h> to <assert.h> if __STDC__ is defined, since
 
2843
  # <limits.h> exists even on freestanding compilers.
 
2844
  # On the NeXT, cc -E runs the code through the compiler's parser,
 
2845
  # not just through cpp. "Syntax error" is here to catch this case.
 
2846
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2847
/* end confdefs.h.  */
 
2848
#ifdef __STDC__
 
2849
# include <limits.h>
 
2850
#else
 
2851
# include <assert.h>
 
2852
#endif
 
2853
                     Syntax error
 
2854
_ACEOF
 
2855
if ac_fn_c_try_cpp "$LINENO"; then :
 
2856
 
 
2857
else
 
2858
  # Broken: fails on valid input.
 
2859
continue
 
2860
fi
 
2861
rm -f conftest.err conftest.$ac_ext
 
2862
 
 
2863
  # OK, works on sane cases.  Now check whether nonexistent headers
 
2864
  # can be detected and how.
 
2865
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
2866
/* end confdefs.h.  */
 
2867
#include <ac_nonexistent.h>
 
2868
_ACEOF
 
2869
if ac_fn_c_try_cpp "$LINENO"; then :
 
2870
  # Broken: success on invalid input.
 
2871
continue
 
2872
else
 
2873
  # Passes both tests.
 
2874
ac_preproc_ok=:
 
2875
break
 
2876
fi
 
2877
rm -f conftest.err conftest.$ac_ext
 
2878
 
 
2879
done
 
2880
# Because of `break', _AC_PREPROC_IFELSE's cleaning code was skipped.
 
2881
rm -f conftest.err conftest.$ac_ext
 
2882
if $ac_preproc_ok; then :
 
2883
 
 
2884
else
 
2885
  { { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
 
2886
$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
 
2887
as_fn_error "C preprocessor \"$CPP\" fails sanity check
 
2888
See \`config.log' for more details." "$LINENO" 5; }
 
2889
fi
 
2890
 
 
2891
ac_ext=c
 
2892
ac_cpp='$CPP $CPPFLAGS'
 
2893
ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
 
2894
ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
 
2895
ac_compiler_gnu=$ac_cv_c_compiler_gnu
 
2896
 
 
2897
 
 
2898
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for grep that handles long lines and -e" >&5
 
2899
$as_echo_n "checking for grep that handles long lines and -e... " >&6; }
 
2900
if test "${ac_cv_path_GREP+set}" = set; then :
 
2901
  $as_echo_n "(cached) " >&6
 
2902
else
 
2903
  if test -z "$GREP"; then
 
2904
  ac_path_GREP_found=false
 
2905
  # Loop through the user's path and test for each of PROGNAME-LIST
 
2906
  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
2907
for as_dir in $PATH$PATH_SEPARATOR/usr/xpg4/bin
 
2908
do
 
2909
  IFS=$as_save_IFS
 
2910
  test -z "$as_dir" && as_dir=.
 
2911
    for ac_prog in grep ggrep; do
 
2912
    for ac_exec_ext in '' $ac_executable_extensions; do
 
2913
      ac_path_GREP="$as_dir/$ac_prog$ac_exec_ext"
 
2914
      { test -f "$ac_path_GREP" && $as_test_x "$ac_path_GREP"; } || continue
 
2915
# Check for GNU ac_path_GREP and select it if it is found.
 
2916
  # Check for GNU $ac_path_GREP
 
2917
case `"$ac_path_GREP" --version 2>&1` in
 
2918
*GNU*)
 
2919
  ac_cv_path_GREP="$ac_path_GREP" ac_path_GREP_found=:;;
 
2920
*)
 
2921
  ac_count=0
 
2922
  $as_echo_n 0123456789 >"conftest.in"
 
2923
  while :
 
2924
  do
 
2925
    cat "conftest.in" "conftest.in" >"conftest.tmp"
 
2926
    mv "conftest.tmp" "conftest.in"
 
2927
    cp "conftest.in" "conftest.nl"
 
2928
    $as_echo 'GREP' >> "conftest.nl"
 
2929
    "$ac_path_GREP" -e 'GREP$' -e '-(cannot match)-' < "conftest.nl" >"conftest.out" 2>/dev/null || break
 
2930
    diff "conftest.out" "conftest.nl" >/dev/null 2>&1 || break
 
2931
    as_fn_arith $ac_count + 1 && ac_count=$as_val
 
2932
    if test $ac_count -gt ${ac_path_GREP_max-0}; then
 
2933
      # Best one so far, save it but keep looking for a better one
 
2934
      ac_cv_path_GREP="$ac_path_GREP"
 
2935
      ac_path_GREP_max=$ac_count
 
2936
    fi
 
2937
    # 10*(2^10) chars as input seems more than enough
 
2938
    test $ac_count -gt 10 && break
 
2939
  done
 
2940
  rm -f conftest.in conftest.tmp conftest.nl conftest.out;;
 
2941
esac
 
2942
 
 
2943
      $ac_path_GREP_found && break 3
 
2944
    done
 
2945
  done
 
2946
  done
 
2947
IFS=$as_save_IFS
 
2948
  if test -z "$ac_cv_path_GREP"; then
 
2949
    as_fn_error "no acceptable grep could be found in $PATH$PATH_SEPARATOR/usr/xpg4/bin" "$LINENO" 5
 
2950
  fi
 
2951
else
 
2952
  ac_cv_path_GREP=$GREP
 
2953
fi
 
2954
 
 
2955
fi
 
2956
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_path_GREP" >&5
 
2957
$as_echo "$ac_cv_path_GREP" >&6; }
 
2958
 GREP="$ac_cv_path_GREP"
 
2959
 
 
2960
 
 
2961
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for egrep" >&5
 
2962
$as_echo_n "checking for egrep... " >&6; }
 
2963
if test "${ac_cv_path_EGREP+set}" = set; then :
 
2964
  $as_echo_n "(cached) " >&6
 
2965
else
 
2966
  if echo a | $GREP -E '(a|b)' >/dev/null 2>&1
 
2967
   then ac_cv_path_EGREP="$GREP -E"
 
2968
   else
 
2969
     if test -z "$EGREP"; then
 
2970
  ac_path_EGREP_found=false
 
2971
  # Loop through the user's path and test for each of PROGNAME-LIST
 
2972
  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
2973
for as_dir in $PATH$PATH_SEPARATOR/usr/xpg4/bin
 
2974
do
 
2975
  IFS=$as_save_IFS
 
2976
  test -z "$as_dir" && as_dir=.
 
2977
    for ac_prog in egrep; do
 
2978
    for ac_exec_ext in '' $ac_executable_extensions; do
 
2979
      ac_path_EGREP="$as_dir/$ac_prog$ac_exec_ext"
 
2980
      { test -f "$ac_path_EGREP" && $as_test_x "$ac_path_EGREP"; } || continue
 
2981
# Check for GNU ac_path_EGREP and select it if it is found.
 
2982
  # Check for GNU $ac_path_EGREP
 
2983
case `"$ac_path_EGREP" --version 2>&1` in
 
2984
*GNU*)
 
2985
  ac_cv_path_EGREP="$ac_path_EGREP" ac_path_EGREP_found=:;;
 
2986
*)
 
2987
  ac_count=0
 
2988
  $as_echo_n 0123456789 >"conftest.in"
 
2989
  while :
 
2990
  do
 
2991
    cat "conftest.in" "conftest.in" >"conftest.tmp"
 
2992
    mv "conftest.tmp" "conftest.in"
 
2993
    cp "conftest.in" "conftest.nl"
 
2994
    $as_echo 'EGREP' >> "conftest.nl"
 
2995
    "$ac_path_EGREP" 'EGREP$' < "conftest.nl" >"conftest.out" 2>/dev/null || break
 
2996
    diff "conftest.out" "conftest.nl" >/dev/null 2>&1 || break
 
2997
    as_fn_arith $ac_count + 1 && ac_count=$as_val
 
2998
    if test $ac_count -gt ${ac_path_EGREP_max-0}; then
 
2999
      # Best one so far, save it but keep looking for a better one
 
3000
      ac_cv_path_EGREP="$ac_path_EGREP"
 
3001
      ac_path_EGREP_max=$ac_count
 
3002
    fi
 
3003
    # 10*(2^10) chars as input seems more than enough
 
3004
    test $ac_count -gt 10 && break
 
3005
  done
 
3006
  rm -f conftest.in conftest.tmp conftest.nl conftest.out;;
 
3007
esac
 
3008
 
 
3009
      $ac_path_EGREP_found && break 3
 
3010
    done
 
3011
  done
 
3012
  done
 
3013
IFS=$as_save_IFS
 
3014
  if test -z "$ac_cv_path_EGREP"; then
 
3015
    as_fn_error "no acceptable egrep could be found in $PATH$PATH_SEPARATOR/usr/xpg4/bin" "$LINENO" 5
 
3016
  fi
 
3017
else
 
3018
  ac_cv_path_EGREP=$EGREP
 
3019
fi
 
3020
 
 
3021
   fi
 
3022
fi
 
3023
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_path_EGREP" >&5
 
3024
$as_echo "$ac_cv_path_EGREP" >&6; }
 
3025
 EGREP="$ac_cv_path_EGREP"
 
3026
 
 
3027
 
 
3028
{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for ANSI C header files" >&5
 
3029
$as_echo_n "checking for ANSI C header files... " >&6; }
 
3030
if test "${ac_cv_header_stdc+set}" = set; then :
 
3031
  $as_echo_n "(cached) " >&6
 
3032
else
 
3033
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
3034
/* end confdefs.h.  */
 
3035
#include <stdlib.h>
 
3036
#include <stdarg.h>
 
3037
#include <string.h>
 
3038
#include <float.h>
 
3039
 
 
3040
int
 
3041
main ()
 
3042
{
 
3043
 
 
3044
  ;
 
3045
  return 0;
 
3046
}
 
3047
_ACEOF
 
3048
if ac_fn_c_try_compile "$LINENO"; then :
 
3049
  ac_cv_header_stdc=yes
 
3050
else
 
3051
  ac_cv_header_stdc=no
 
3052
fi
 
3053
rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
 
3054
 
 
3055
if test $ac_cv_header_stdc = yes; then
 
3056
  # SunOS 4.x string.h does not declare mem*, contrary to ANSI.
 
3057
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
3058
/* end confdefs.h.  */
 
3059
#include <string.h>
 
3060
 
 
3061
_ACEOF
 
3062
if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
 
3063
  $EGREP "memchr" >/dev/null 2>&1; then :
 
3064
 
 
3065
else
 
3066
  ac_cv_header_stdc=no
 
3067
fi
 
3068
rm -f conftest*
 
3069
 
 
3070
fi
 
3071
 
 
3072
if test $ac_cv_header_stdc = yes; then
 
3073
  # ISC 2.0.2 stdlib.h does not declare free, contrary to ANSI.
 
3074
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
3075
/* end confdefs.h.  */
 
3076
#include <stdlib.h>
 
3077
 
 
3078
_ACEOF
 
3079
if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
 
3080
  $EGREP "free" >/dev/null 2>&1; then :
 
3081
 
 
3082
else
 
3083
  ac_cv_header_stdc=no
 
3084
fi
 
3085
rm -f conftest*
 
3086
 
 
3087
fi
 
3088
 
 
3089
if test $ac_cv_header_stdc = yes; then
 
3090
  # /bin/cc in Irix-4.0.5 gets non-ANSI ctype macros unless using -ansi.
 
3091
  if test "$cross_compiling" = yes; then :
 
3092
  :
 
3093
else
 
3094
  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
 
3095
/* end confdefs.h.  */
 
3096
#include <ctype.h>
 
3097
#include <stdlib.h>
 
3098
#if ((' ' & 0x0FF) == 0x020)
 
3099
# define ISLOWER(c) ('a' <= (c) && (c) <= 'z')
 
3100
# define TOUPPER(c) (ISLOWER(c) ? 'A' + ((c) - 'a') : (c))
 
3101
#else
 
3102
# define ISLOWER(c) \
 
3103
                   (('a' <= (c) && (c) <= 'i') \
 
3104
                     || ('j' <= (c) && (c) <= 'r') \
 
3105
                     || ('s' <= (c) && (c) <= 'z'))
 
3106
# define TOUPPER(c) (ISLOWER(c) ? ((c) | 0x40) : (c))
 
3107
#endif
 
3108
 
 
3109
#define XOR(e, f) (((e) && !(f)) || (!(e) && (f)))
 
3110
int
 
3111
main ()
 
3112
{
 
3113
  int i;
 
3114
  for (i = 0; i < 256; i++)
 
3115
    if (XOR (islower (i), ISLOWER (i))
 
3116
        || toupper (i) != TOUPPER (i))
 
3117
      return 2;
 
3118
  return 0;
 
3119
}
 
3120
_ACEOF
 
3121
if ac_fn_c_try_run "$LINENO"; then :
 
3122
 
 
3123
else
 
3124
  ac_cv_header_stdc=no
 
3125
fi
 
3126
rm -f core *.core core.conftest.* gmon.out bb.out conftest$ac_exeext \
 
3127
  conftest.$ac_objext conftest.beam conftest.$ac_ext
 
3128
fi
 
3129
 
 
3130
fi
 
3131
fi
 
3132
{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_header_stdc" >&5
 
3133
$as_echo "$ac_cv_header_stdc" >&6; }
 
3134
if test $ac_cv_header_stdc = yes; then
 
3135
 
 
3136
$as_echo "#define STDC_HEADERS 1" >>confdefs.h
 
3137
 
 
3138
fi
 
3139
 
 
3140
# On IRIX 5.3, sys/types and inttypes.h are conflicting.
 
3141
for ac_header in sys/types.h sys/stat.h stdlib.h string.h memory.h strings.h \
 
3142
                  inttypes.h stdint.h unistd.h
 
3143
do :
 
3144
  as_ac_Header=`$as_echo "ac_cv_header_$ac_header" | $as_tr_sh`
 
3145
ac_fn_c_check_header_compile "$LINENO" "$ac_header" "$as_ac_Header" "$ac_includes_default
 
3146
"
 
3147
eval as_val=\$$as_ac_Header
 
3148
   if test "x$as_val" = x""yes; then :
 
3149
  cat >>confdefs.h <<_ACEOF
 
3150
#define `$as_echo "HAVE_$ac_header" | $as_tr_cpp` 1
 
3151
_ACEOF
 
3152
 
 
3153
fi
 
3154
 
 
3155
done
 
3156
 
 
3157
 
 
3158
for ac_header in sys/types.h unistd.h sys/stat.h
 
3159
do :
 
3160
  as_ac_Header=`$as_echo "ac_cv_header_$ac_header" | $as_tr_sh`
 
3161
ac_fn_c_check_header_mongrel "$LINENO" "$ac_header" "$as_ac_Header" "$ac_includes_default"
 
3162
eval as_val=\$$as_ac_Header
 
3163
   if test "x$as_val" = x""yes; then :
 
3164
  cat >>confdefs.h <<_ACEOF
 
3165
#define `$as_echo "HAVE_$ac_header" | $as_tr_cpp` 1
 
3166
_ACEOF
 
3167
 
 
3168
fi
 
3169
 
 
3170
done
 
3171
 
 
3172
 
 
3173
cat >confcache <<\_ACEOF
 
3174
# This file is a shell script that caches the results of configure
 
3175
# tests run on this system so they can be shared between configure
 
3176
# scripts and configure runs, see configure's option --config-cache.
 
3177
# It is not useful on other systems.  If it contains results you don't
 
3178
# want to keep, you may remove or edit it.
 
3179
#
 
3180
# config.status only pays attention to the cache file if you give it
 
3181
# the --recheck option to rerun configure.
 
3182
#
 
3183
# `ac_cv_env_foo' variables (set or unset) will be overridden when
 
3184
# loading this file, other *unset* `ac_cv_foo' will be assigned the
 
3185
# following values.
 
3186
 
 
3187
_ACEOF
 
3188
 
 
3189
# The following way of writing the cache mishandles newlines in values,
 
3190
# but we know of no workaround that is simple, portable, and efficient.
 
3191
# So, we kill variables containing newlines.
 
3192
# Ultrix sh set writes to stderr and can't be redirected directly,
 
3193
# and sets the high bit in the cache file unless we assign to the vars.
 
3194
(
 
3195
  for ac_var in `(set) 2>&1 | sed -n 's/^\([a-zA-Z_][a-zA-Z0-9_]*\)=.*/\1/p'`; do
 
3196
    eval ac_val=\$$ac_var
 
3197
    case $ac_val in #(
 
3198
    *${as_nl}*)
 
3199
      case $ac_var in #(
 
3200
      *_cv_*) { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: cache variable $ac_var contains a newline" >&5
 
3201
$as_echo "$as_me: WARNING: cache variable $ac_var contains a newline" >&2;} ;;
 
3202
      esac
 
3203
      case $ac_var in #(
 
3204
      _ | IFS | as_nl) ;; #(
 
3205
      BASH_ARGV | BASH_SOURCE) eval $ac_var= ;; #(
 
3206
      *) { eval $ac_var=; unset $ac_var;} ;;
 
3207
      esac ;;
 
3208
    esac
 
3209
  done
 
3210
 
 
3211
  (set) 2>&1 |
 
3212
    case $as_nl`(ac_space=' '; set) 2>&1` in #(
 
3213
    *${as_nl}ac_space=\ *)
 
3214
      # `set' does not quote correctly, so add quotes: double-quote
 
3215
      # substitution turns \\\\ into \\, and sed turns \\ into \.
 
3216
      sed -n \
 
3217
        "s/'/'\\\\''/g;
 
3218
          s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='\\2'/p"
 
3219
      ;; #(
 
3220
    *)
 
3221
      # `set' quotes correctly as required by POSIX, so do not add quotes.
 
3222
      sed -n "/^[_$as_cr_alnum]*_cv_[_$as_cr_alnum]*=/p"
 
3223
      ;;
 
3224
    esac |
 
3225
    sort
 
3226
) |
 
3227
  sed '
 
3228
     /^ac_cv_env_/b end
 
3229
     t clear
 
3230
     :clear
 
3231
     s/^\([^=]*\)=\(.*[{}].*\)$/test "${\1+set}" = set || &/
 
3232
     t end
 
3233
     s/^\([^=]*\)=\(.*\)$/\1=${\1=\2}/
 
3234
     :end' >>confcache
 
3235
if diff "$cache_file" confcache >/dev/null 2>&1; then :; else
 
3236
  if test -w "$cache_file"; then
 
3237
    test "x$cache_file" != "x/dev/null" &&
 
3238
      { $as_echo "$as_me:${as_lineno-$LINENO}: updating cache $cache_file" >&5
 
3239
$as_echo "$as_me: updating cache $cache_file" >&6;}
 
3240
    cat confcache >$cache_file
 
3241
  else
 
3242
    { $as_echo "$as_me:${as_lineno-$LINENO}: not updating unwritable cache $cache_file" >&5
 
3243
$as_echo "$as_me: not updating unwritable cache $cache_file" >&6;}
 
3244
  fi
 
3245
fi
 
3246
rm -f confcache
 
3247
 
 
3248
test "x$prefix" = xNONE && prefix=$ac_default_prefix
 
3249
# Let make expand exec_prefix.
 
3250
test "x$exec_prefix" = xNONE && exec_prefix='${prefix}'
 
3251
 
 
3252
DEFS=-DHAVE_CONFIG_H
 
3253
 
 
3254
ac_libobjs=
 
3255
ac_ltlibobjs=
 
3256
for ac_i in : $LIBOBJS; do test "x$ac_i" = x: && continue
 
3257
  # 1. Remove the extension, and $U if already installed.
 
3258
  ac_script='s/\$U\././;s/\.o$//;s/\.obj$//'
 
3259
  ac_i=`$as_echo "$ac_i" | sed "$ac_script"`
 
3260
  # 2. Prepend LIBOBJDIR.  When used with automake>=1.10 LIBOBJDIR
 
3261
  #    will be set to the directory where LIBOBJS objects are built.
 
3262
  as_fn_append ac_libobjs " \${LIBOBJDIR}$ac_i\$U.$ac_objext"
 
3263
  as_fn_append ac_ltlibobjs " \${LIBOBJDIR}$ac_i"'$U.lo'
 
3264
done
 
3265
LIBOBJS=$ac_libobjs
 
3266
 
 
3267
LTLIBOBJS=$ac_ltlibobjs
 
3268
 
 
3269
 
 
3270
 
 
3271
: ${CONFIG_STATUS=./config.status}
 
3272
ac_write_fail=0
 
3273
ac_clean_files_save=$ac_clean_files
 
3274
ac_clean_files="$ac_clean_files $CONFIG_STATUS"
 
3275
{ $as_echo "$as_me:${as_lineno-$LINENO}: creating $CONFIG_STATUS" >&5
 
3276
$as_echo "$as_me: creating $CONFIG_STATUS" >&6;}
 
3277
as_write_fail=0
 
3278
cat >$CONFIG_STATUS <<_ASEOF || as_write_fail=1
 
3279
#! $SHELL
 
3280
# Generated by $as_me.
 
3281
# Run this file to recreate the current configuration.
 
3282
# Compiler output produced by configure, useful for debugging
 
3283
# configure, is in config.log if it exists.
 
3284
 
 
3285
debug=false
 
3286
ac_cs_recheck=false
 
3287
ac_cs_silent=false
 
3288
 
 
3289
SHELL=\${CONFIG_SHELL-$SHELL}
 
3290
export SHELL
 
3291
_ASEOF
 
3292
cat >>$CONFIG_STATUS <<\_ASEOF || as_write_fail=1
 
3293
## -------------------- ##
 
3294
## M4sh Initialization. ##
 
3295
## -------------------- ##
 
3296
 
 
3297
# Be more Bourne compatible
 
3298
DUALCASE=1; export DUALCASE # for MKS sh
 
3299
if test -n "${ZSH_VERSION+set}" && (emulate sh) >/dev/null 2>&1; then :
 
3300
  emulate sh
 
3301
  NULLCMD=:
 
3302
  # Pre-4.2 versions of Zsh do word splitting on ${1+"$@"}, which
 
3303
  # is contrary to our usage.  Disable this feature.
 
3304
  alias -g '${1+"$@"}'='"$@"'
 
3305
  setopt NO_GLOB_SUBST
 
3306
else
 
3307
  case `(set -o) 2>/dev/null` in #(
 
3308
  *posix*) :
 
3309
    set -o posix ;; #(
 
3310
  *) :
 
3311
     ;;
 
3312
esac
 
3313
fi
 
3314
 
 
3315
 
 
3316
as_nl='
 
3317
'
 
3318
export as_nl
 
3319
# Printing a long string crashes Solaris 7 /usr/bin/printf.
 
3320
as_echo='\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\'
 
3321
as_echo=$as_echo$as_echo$as_echo$as_echo$as_echo
 
3322
as_echo=$as_echo$as_echo$as_echo$as_echo$as_echo$as_echo
 
3323
# Prefer a ksh shell builtin over an external printf program on Solaris,
 
3324
# but without wasting forks for bash or zsh.
 
3325
if test -z "$BASH_VERSION$ZSH_VERSION" \
 
3326
    && (test "X`print -r -- $as_echo`" = "X$as_echo") 2>/dev/null; then
 
3327
  as_echo='print -r --'
 
3328
  as_echo_n='print -rn --'
 
3329
elif (test "X`printf %s $as_echo`" = "X$as_echo") 2>/dev/null; then
 
3330
  as_echo='printf %s\n'
 
3331
  as_echo_n='printf %s'
 
3332
else
 
3333
  if test "X`(/usr/ucb/echo -n -n $as_echo) 2>/dev/null`" = "X-n $as_echo"; then
 
3334
    as_echo_body='eval /usr/ucb/echo -n "$1$as_nl"'
 
3335
    as_echo_n='/usr/ucb/echo -n'
 
3336
  else
 
3337
    as_echo_body='eval expr "X$1" : "X\\(.*\\)"'
 
3338
    as_echo_n_body='eval
 
3339
      arg=$1;
 
3340
      case $arg in #(
 
3341
      *"$as_nl"*)
 
3342
        expr "X$arg" : "X\\(.*\\)$as_nl";
 
3343
        arg=`expr "X$arg" : ".*$as_nl\\(.*\\)"`;;
 
3344
      esac;
 
3345
      expr "X$arg" : "X\\(.*\\)" | tr -d "$as_nl"
 
3346
    '
 
3347
    export as_echo_n_body
 
3348
    as_echo_n='sh -c $as_echo_n_body as_echo'
 
3349
  fi
 
3350
  export as_echo_body
 
3351
  as_echo='sh -c $as_echo_body as_echo'
 
3352
fi
 
3353
 
 
3354
# The user is always right.
 
3355
if test "${PATH_SEPARATOR+set}" != set; then
 
3356
  PATH_SEPARATOR=:
 
3357
  (PATH='/bin;/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 && {
 
3358
    (PATH='/bin:/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 ||
 
3359
      PATH_SEPARATOR=';'
 
3360
  }
 
3361
fi
 
3362
 
 
3363
 
 
3364
# IFS
 
3365
# We need space, tab and new line, in precisely that order.  Quoting is
 
3366
# there to prevent editors from complaining about space-tab.
 
3367
# (If _AS_PATH_WALK were called with IFS unset, it would disable word
 
3368
# splitting by setting IFS to empty value.)
 
3369
IFS=" ""        $as_nl"
 
3370
 
 
3371
# Find who we are.  Look in the path if we contain no directory separator.
 
3372
case $0 in #((
 
3373
  *[\\/]* ) as_myself=$0 ;;
 
3374
  *) as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
 
3375
for as_dir in $PATH
 
3376
do
 
3377
  IFS=$as_save_IFS
 
3378
  test -z "$as_dir" && as_dir=.
 
3379
    test -r "$as_dir/$0" && as_myself=$as_dir/$0 && break
 
3380
  done
 
3381
IFS=$as_save_IFS
 
3382
 
 
3383
     ;;
 
3384
esac
 
3385
# We did not find ourselves, most probably we were run as `sh COMMAND'
 
3386
# in which case we are not to be found in the path.
 
3387
if test "x$as_myself" = x; then
 
3388
  as_myself=$0
 
3389
fi
 
3390
if test ! -f "$as_myself"; then
 
3391
  $as_echo "$as_myself: error: cannot find myself; rerun with an absolute file name" >&2
 
3392
  exit 1
 
3393
fi
 
3394
 
 
3395
# Unset variables that we do not need and which cause bugs (e.g. in
 
3396
# pre-3.0 UWIN ksh).  But do not cause bugs in bash 2.01; the "|| exit 1"
 
3397
# suppresses any "Segmentation fault" message there.  '((' could
 
3398
# trigger a bug in pdksh 5.2.14.
 
3399
for as_var in BASH_ENV ENV MAIL MAILPATH
 
3400
do eval test x\${$as_var+set} = xset \
 
3401
  && ( (unset $as_var) || exit 1) >/dev/null 2>&1 && unset $as_var || :
 
3402
done
 
3403
PS1='$ '
 
3404
PS2='> '
 
3405
PS4='+ '
 
3406
 
 
3407
# NLS nuisances.
 
3408
LC_ALL=C
 
3409
export LC_ALL
 
3410
LANGUAGE=C
 
3411
export LANGUAGE
 
3412
 
 
3413
# CDPATH.
 
3414
(unset CDPATH) >/dev/null 2>&1 && unset CDPATH
 
3415
 
 
3416
 
 
3417
# as_fn_error ERROR [LINENO LOG_FD]
 
3418
# ---------------------------------
 
3419
# Output "`basename $0`: error: ERROR" to stderr. If LINENO and LOG_FD are
 
3420
# provided, also output the error to LOG_FD, referencing LINENO. Then exit the
 
3421
# script with status $?, using 1 if that was 0.
 
3422
as_fn_error ()
 
3423
{
 
3424
  as_status=$?; test $as_status -eq 0 && as_status=1
 
3425
  if test "$3"; then
 
3426
    as_lineno=${as_lineno-"$2"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
 
3427
    $as_echo "$as_me:${as_lineno-$LINENO}: error: $1" >&$3
 
3428
  fi
 
3429
  $as_echo "$as_me: error: $1" >&2
 
3430
  as_fn_exit $as_status
 
3431
} # as_fn_error
 
3432
 
 
3433
 
 
3434
# as_fn_set_status STATUS
 
3435
# -----------------------
 
3436
# Set $? to STATUS, without forking.
 
3437
as_fn_set_status ()
 
3438
{
 
3439
  return $1
 
3440
} # as_fn_set_status
 
3441
 
 
3442
# as_fn_exit STATUS
 
3443
# -----------------
 
3444
# Exit the shell with STATUS, even in a "trap 0" or "set -e" context.
 
3445
as_fn_exit ()
 
3446
{
 
3447
  set +e
 
3448
  as_fn_set_status $1
 
3449
  exit $1
 
3450
} # as_fn_exit
 
3451
 
 
3452
# as_fn_unset VAR
 
3453
# ---------------
 
3454
# Portably unset VAR.
 
3455
as_fn_unset ()
 
3456
{
 
3457
  { eval $1=; unset $1;}
 
3458
}
 
3459
as_unset=as_fn_unset
 
3460
# as_fn_append VAR VALUE
 
3461
# ----------------------
 
3462
# Append the text in VALUE to the end of the definition contained in VAR. Take
 
3463
# advantage of any shell optimizations that allow amortized linear growth over
 
3464
# repeated appends, instead of the typical quadratic growth present in naive
 
3465
# implementations.
 
3466
if (eval "as_var=1; as_var+=2; test x\$as_var = x12") 2>/dev/null; then :
 
3467
  eval 'as_fn_append ()
 
3468
  {
 
3469
    eval $1+=\$2
 
3470
  }'
 
3471
else
 
3472
  as_fn_append ()
 
3473
  {
 
3474
    eval $1=\$$1\$2
 
3475
  }
 
3476
fi # as_fn_append
 
3477
 
 
3478
# as_fn_arith ARG...
 
3479
# ------------------
 
3480
# Perform arithmetic evaluation on the ARGs, and store the result in the
 
3481
# global $as_val. Take advantage of shells that can avoid forks. The arguments
 
3482
# must be portable across $(()) and expr.
 
3483
if (eval "test \$(( 1 + 1 )) = 2") 2>/dev/null; then :
 
3484
  eval 'as_fn_arith ()
 
3485
  {
 
3486
    as_val=$(( $* ))
 
3487
  }'
 
3488
else
 
3489
  as_fn_arith ()
 
3490
  {
 
3491
    as_val=`expr "$@" || test $? -eq 1`
 
3492
  }
 
3493
fi # as_fn_arith
 
3494
 
 
3495
 
 
3496
if expr a : '\(a\)' >/dev/null 2>&1 &&
 
3497
   test "X`expr 00001 : '.*\(...\)'`" = X001; then
 
3498
  as_expr=expr
 
3499
else
 
3500
  as_expr=false
 
3501
fi
 
3502
 
 
3503
if (basename -- /) >/dev/null 2>&1 && test "X`basename -- / 2>&1`" = "X/"; then
 
3504
  as_basename=basename
 
3505
else
 
3506
  as_basename=false
 
3507
fi
 
3508
 
 
3509
if (as_dir=`dirname -- /` && test "X$as_dir" = X/) >/dev/null 2>&1; then
 
3510
  as_dirname=dirname
 
3511
else
 
3512
  as_dirname=false
 
3513
fi
 
3514
 
 
3515
as_me=`$as_basename -- "$0" ||
 
3516
$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
 
3517
         X"$0" : 'X\(//\)$' \| \
 
3518
         X"$0" : 'X\(/\)' \| . 2>/dev/null ||
 
3519
$as_echo X/"$0" |
 
3520
    sed '/^.*\/\([^/][^/]*\)\/*$/{
 
3521
            s//\1/
 
3522
            q
 
3523
          }
 
3524
          /^X\/\(\/\/\)$/{
 
3525
            s//\1/
 
3526
            q
 
3527
          }
 
3528
          /^X\/\(\/\).*/{
 
3529
            s//\1/
 
3530
            q
 
3531
          }
 
3532
          s/.*/./; q'`
 
3533
 
 
3534
# Avoid depending upon Character Ranges.
 
3535
as_cr_letters='abcdefghijklmnopqrstuvwxyz'
 
3536
as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
 
3537
as_cr_Letters=$as_cr_letters$as_cr_LETTERS
 
3538
as_cr_digits='0123456789'
 
3539
as_cr_alnum=$as_cr_Letters$as_cr_digits
 
3540
 
 
3541
ECHO_C= ECHO_N= ECHO_T=
 
3542
case `echo -n x` in #(((((
 
3543
-n*)
 
3544
  case `echo 'xy\c'` in
 
3545
  *c*) ECHO_T=' ';;     # ECHO_T is single tab character.
 
3546
  xy)  ECHO_C='\c';;
 
3547
  *)   echo `echo ksh88 bug on AIX 6.1` > /dev/null
 
3548
       ECHO_T=' ';;
 
3549
  esac;;
 
3550
*)
 
3551
  ECHO_N='-n';;
 
3552
esac
 
3553
 
 
3554
rm -f conf$$ conf$$.exe conf$$.file
 
3555
if test -d conf$$.dir; then
 
3556
  rm -f conf$$.dir/conf$$.file
 
3557
else
 
3558
  rm -f conf$$.dir
 
3559
  mkdir conf$$.dir 2>/dev/null
 
3560
fi
 
3561
if (echo >conf$$.file) 2>/dev/null; then
 
3562
  if ln -s conf$$.file conf$$ 2>/dev/null; then
 
3563
    as_ln_s='ln -s'
 
3564
    # ... but there are two gotchas:
 
3565
    # 1) On MSYS, both `ln -s file dir' and `ln file dir' fail.
 
3566
    # 2) DJGPP < 2.04 has no symlinks; `ln -s' creates a wrapper executable.
 
3567
    # In both cases, we have to default to `cp -p'.
 
3568
    ln -s conf$$.file conf$$.dir 2>/dev/null && test ! -f conf$$.exe ||
 
3569
      as_ln_s='cp -p'
 
3570
  elif ln conf$$.file conf$$ 2>/dev/null; then
 
3571
    as_ln_s=ln
 
3572
  else
 
3573
    as_ln_s='cp -p'
 
3574
  fi
 
3575
else
 
3576
  as_ln_s='cp -p'
 
3577
fi
 
3578
rm -f conf$$ conf$$.exe conf$$.dir/conf$$.file conf$$.file
 
3579
rmdir conf$$.dir 2>/dev/null
 
3580
 
 
3581
 
 
3582
# as_fn_mkdir_p
 
3583
# -------------
 
3584
# Create "$as_dir" as a directory, including parents if necessary.
 
3585
as_fn_mkdir_p ()
 
3586
{
 
3587
 
 
3588
  case $as_dir in #(
 
3589
  -*) as_dir=./$as_dir;;
 
3590
  esac
 
3591
  test -d "$as_dir" || eval $as_mkdir_p || {
 
3592
    as_dirs=
 
3593
    while :; do
 
3594
      case $as_dir in #(
 
3595
      *\'*) as_qdir=`$as_echo "$as_dir" | sed "s/'/'\\\\\\\\''/g"`;; #'(
 
3596
      *) as_qdir=$as_dir;;
 
3597
      esac
 
3598
      as_dirs="'$as_qdir' $as_dirs"
 
3599
      as_dir=`$as_dirname -- "$as_dir" ||
 
3600
$as_expr X"$as_dir" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
 
3601
         X"$as_dir" : 'X\(//\)[^/]' \| \
 
3602
         X"$as_dir" : 'X\(//\)$' \| \
 
3603
         X"$as_dir" : 'X\(/\)' \| . 2>/dev/null ||
 
3604
$as_echo X"$as_dir" |
 
3605
    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
 
3606
            s//\1/
 
3607
            q
 
3608
          }
 
3609
          /^X\(\/\/\)[^/].*/{
 
3610
            s//\1/
 
3611
            q
 
3612
          }
 
3613
          /^X\(\/\/\)$/{
 
3614
            s//\1/
 
3615
            q
 
3616
          }
 
3617
          /^X\(\/\).*/{
 
3618
            s//\1/
 
3619
            q
 
3620
          }
 
3621
          s/.*/./; q'`
 
3622
      test -d "$as_dir" && break
 
3623
    done
 
3624
    test -z "$as_dirs" || eval "mkdir $as_dirs"
 
3625
  } || test -d "$as_dir" || as_fn_error "cannot create directory $as_dir"
 
3626
 
 
3627
 
 
3628
} # as_fn_mkdir_p
 
3629
if mkdir -p . 2>/dev/null; then
 
3630
  as_mkdir_p='mkdir -p "$as_dir"'
 
3631
else
 
3632
  test -d ./-p && rmdir ./-p
 
3633
  as_mkdir_p=false
 
3634
fi
 
3635
 
 
3636
if test -x / >/dev/null 2>&1; then
 
3637
  as_test_x='test -x'
 
3638
else
 
3639
  if ls -dL / >/dev/null 2>&1; then
 
3640
    as_ls_L_option=L
 
3641
  else
 
3642
    as_ls_L_option=
 
3643
  fi
 
3644
  as_test_x='
 
3645
    eval sh -c '\''
 
3646
      if test -d "$1"; then
 
3647
        test -d "$1/.";
 
3648
      else
 
3649
        case $1 in #(
 
3650
        -*)set "./$1";;
 
3651
        esac;
 
3652
        case `ls -ld'$as_ls_L_option' "$1" 2>/dev/null` in #((
 
3653
        ???[sx]*):;;*)false;;esac;fi
 
3654
    '\'' sh
 
3655
  '
 
3656
fi
 
3657
as_executable_p=$as_test_x
 
3658
 
 
3659
# Sed expression to map a string onto a valid CPP name.
 
3660
as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
 
3661
 
 
3662
# Sed expression to map a string onto a valid variable name.
 
3663
as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
 
3664
 
 
3665
 
 
3666
exec 6>&1
 
3667
## ----------------------------------- ##
 
3668
## Main body of $CONFIG_STATUS script. ##
 
3669
## ----------------------------------- ##
 
3670
_ASEOF
 
3671
test $as_write_fail = 0 && chmod +x $CONFIG_STATUS || ac_write_fail=1
 
3672
 
 
3673
cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
 
3674
# Save the log message, to keep $0 and so on meaningful, and to
 
3675
# report actual input values of CONFIG_FILES etc. instead of their
 
3676
# values after options handling.
 
3677
ac_log="
 
3678
This file was extended by Haskell directory package $as_me 1.0, which was
 
3679
generated by GNU Autoconf 2.65.  Invocation command line was
 
3680
 
 
3681
  CONFIG_FILES    = $CONFIG_FILES
 
3682
  CONFIG_HEADERS  = $CONFIG_HEADERS
 
3683
  CONFIG_LINKS    = $CONFIG_LINKS
 
3684
  CONFIG_COMMANDS = $CONFIG_COMMANDS
 
3685
  $ $0 $@
 
3686
 
 
3687
on `(hostname || uname -n) 2>/dev/null | sed 1q`
 
3688
"
 
3689
 
 
3690
_ACEOF
 
3691
 
 
3692
 
 
3693
case $ac_config_headers in *"
 
3694
"*) set x $ac_config_headers; shift; ac_config_headers=$*;;
 
3695
esac
 
3696
 
 
3697
 
 
3698
cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
 
3699
# Files that config.status was made for.
 
3700
config_headers="$ac_config_headers"
 
3701
 
 
3702
_ACEOF
 
3703
 
 
3704
cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
 
3705
ac_cs_usage="\
 
3706
\`$as_me' instantiates files and other configuration actions
 
3707
from templates according to the current configuration.  Unless the files
 
3708
and actions are specified as TAGs, all are instantiated by default.
 
3709
 
 
3710
Usage: $0 [OPTION]... [TAG]...
 
3711
 
 
3712
  -h, --help       print this help, then exit
 
3713
  -V, --version    print version number and configuration settings, then exit
 
3714
      --config     print configuration, then exit
 
3715
  -q, --quiet, --silent
 
3716
                   do not print progress messages
 
3717
  -d, --debug      don't remove temporary files
 
3718
      --recheck    update $as_me by reconfiguring in the same conditions
 
3719
      --header=FILE[:TEMPLATE]
 
3720
                   instantiate the configuration header FILE
 
3721
 
 
3722
Configuration headers:
 
3723
$config_headers
 
3724
 
 
3725
Report bugs to <libraries@haskell.org>."
 
3726
 
 
3727
_ACEOF
 
3728
cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
 
3729
ac_cs_config="`$as_echo "$ac_configure_args" | sed 's/^ //; s/[\\""\`\$]/\\\\&/g'`"
 
3730
ac_cs_version="\\
 
3731
Haskell directory package config.status 1.0
 
3732
configured by $0, generated by GNU Autoconf 2.65,
 
3733
  with options \\"\$ac_cs_config\\"
 
3734
 
 
3735
Copyright (C) 2009 Free Software Foundation, Inc.
 
3736
This config.status script is free software; the Free Software Foundation
 
3737
gives unlimited permission to copy, distribute and modify it."
 
3738
 
 
3739
ac_pwd='$ac_pwd'
 
3740
srcdir='$srcdir'
 
3741
test -n "\$AWK" || AWK=awk
 
3742
_ACEOF
 
3743
 
 
3744
cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
 
3745
# The default lists apply if the user does not specify any file.
 
3746
ac_need_defaults=:
 
3747
while test $# != 0
 
3748
do
 
3749
  case $1 in
 
3750
  --*=*)
 
3751
    ac_option=`expr "X$1" : 'X\([^=]*\)='`
 
3752
    ac_optarg=`expr "X$1" : 'X[^=]*=\(.*\)'`
 
3753
    ac_shift=:
 
3754
    ;;
 
3755
  *)
 
3756
    ac_option=$1
 
3757
    ac_optarg=$2
 
3758
    ac_shift=shift
 
3759
    ;;
 
3760
  esac
 
3761
 
 
3762
  case $ac_option in
 
3763
  # Handling of the options.
 
3764
  -recheck | --recheck | --rechec | --reche | --rech | --rec | --re | --r)
 
3765
    ac_cs_recheck=: ;;
 
3766
  --version | --versio | --versi | --vers | --ver | --ve | --v | -V )
 
3767
    $as_echo "$ac_cs_version"; exit ;;
 
3768
  --config | --confi | --conf | --con | --co | --c )
 
3769
    $as_echo "$ac_cs_config"; exit ;;
 
3770
  --debug | --debu | --deb | --de | --d | -d )
 
3771
    debug=: ;;
 
3772
  --header | --heade | --head | --hea )
 
3773
    $ac_shift
 
3774
    case $ac_optarg in
 
3775
    *\'*) ac_optarg=`$as_echo "$ac_optarg" | sed "s/'/'\\\\\\\\''/g"` ;;
 
3776
    esac
 
3777
    as_fn_append CONFIG_HEADERS " '$ac_optarg'"
 
3778
    ac_need_defaults=false;;
 
3779
  --he | --h)
 
3780
    # Conflict between --help and --header
 
3781
    as_fn_error "ambiguous option: \`$1'
 
3782
Try \`$0 --help' for more information.";;
 
3783
  --help | --hel | -h )
 
3784
    $as_echo "$ac_cs_usage"; exit ;;
 
3785
  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
 
3786
  | -silent | --silent | --silen | --sile | --sil | --si | --s)
 
3787
    ac_cs_silent=: ;;
 
3788
 
 
3789
  # This is an error.
 
3790
  -*) as_fn_error "unrecognized option: \`$1'
 
3791
Try \`$0 --help' for more information." ;;
 
3792
 
 
3793
  *) as_fn_append ac_config_targets " $1"
 
3794
     ac_need_defaults=false ;;
 
3795
 
 
3796
  esac
 
3797
  shift
 
3798
done
 
3799
 
 
3800
ac_configure_extra_args=
 
3801
 
 
3802
if $ac_cs_silent; then
 
3803
  exec 6>/dev/null
 
3804
  ac_configure_extra_args="$ac_configure_extra_args --silent"
 
3805
fi
 
3806
 
 
3807
_ACEOF
 
3808
cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
 
3809
if \$ac_cs_recheck; then
 
3810
  set X '$SHELL' '$0' $ac_configure_args \$ac_configure_extra_args --no-create --no-recursion
 
3811
  shift
 
3812
  \$as_echo "running CONFIG_SHELL=$SHELL \$*" >&6
 
3813
  CONFIG_SHELL='$SHELL'
 
3814
  export CONFIG_SHELL
 
3815
  exec "\$@"
 
3816
fi
 
3817
 
 
3818
_ACEOF
 
3819
cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
 
3820
exec 5>>config.log
 
3821
{
 
3822
  echo
 
3823
  sed 'h;s/./-/g;s/^.../## /;s/...$/ ##/;p;x;p;x' <<_ASBOX
 
3824
## Running $as_me. ##
 
3825
_ASBOX
 
3826
  $as_echo "$ac_log"
 
3827
} >&5
 
3828
 
 
3829
_ACEOF
 
3830
cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
 
3831
_ACEOF
 
3832
 
 
3833
cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
 
3834
 
 
3835
# Handling of arguments.
 
3836
for ac_config_target in $ac_config_targets
 
3837
do
 
3838
  case $ac_config_target in
 
3839
    "include/HsDirectoryConfig.h") CONFIG_HEADERS="$CONFIG_HEADERS include/HsDirectoryConfig.h" ;;
 
3840
 
 
3841
  *) as_fn_error "invalid argument: \`$ac_config_target'" "$LINENO" 5;;
 
3842
  esac
 
3843
done
 
3844
 
 
3845
 
 
3846
# If the user did not use the arguments to specify the items to instantiate,
 
3847
# then the envvar interface is used.  Set only those that are not.
 
3848
# We use the long form for the default assignment because of an extremely
 
3849
# bizarre bug on SunOS 4.1.3.
 
3850
if $ac_need_defaults; then
 
3851
  test "${CONFIG_HEADERS+set}" = set || CONFIG_HEADERS=$config_headers
 
3852
fi
 
3853
 
 
3854
# Have a temporary directory for convenience.  Make it in the build tree
 
3855
# simply because there is no reason against having it here, and in addition,
 
3856
# creating and moving files from /tmp can sometimes cause problems.
 
3857
# Hook for its removal unless debugging.
 
3858
# Note that there is a small window in which the directory will not be cleaned:
 
3859
# after its creation but before its name has been assigned to `$tmp'.
 
3860
$debug ||
 
3861
{
 
3862
  tmp=
 
3863
  trap 'exit_status=$?
 
3864
  { test -z "$tmp" || test ! -d "$tmp" || rm -fr "$tmp"; } && exit $exit_status
 
3865
' 0
 
3866
  trap 'as_fn_exit 1' 1 2 13 15
 
3867
}
 
3868
# Create a (secure) tmp directory for tmp files.
 
3869
 
 
3870
{
 
3871
  tmp=`(umask 077 && mktemp -d "./confXXXXXX") 2>/dev/null` &&
 
3872
  test -n "$tmp" && test -d "$tmp"
 
3873
}  ||
 
3874
{
 
3875
  tmp=./conf$$-$RANDOM
 
3876
  (umask 077 && mkdir "$tmp")
 
3877
} || as_fn_error "cannot create a temporary directory in ." "$LINENO" 5
 
3878
 
 
3879
# Set up the scripts for CONFIG_HEADERS section.
 
3880
# No need to generate them if there are no CONFIG_HEADERS.
 
3881
# This happens for instance with `./config.status Makefile'.
 
3882
if test -n "$CONFIG_HEADERS"; then
 
3883
cat >"$tmp/defines.awk" <<\_ACAWK ||
 
3884
BEGIN {
 
3885
_ACEOF
 
3886
 
 
3887
# Transform confdefs.h into an awk script `defines.awk', embedded as
 
3888
# here-document in config.status, that substitutes the proper values into
 
3889
# config.h.in to produce config.h.
 
3890
 
 
3891
# Create a delimiter string that does not exist in confdefs.h, to ease
 
3892
# handling of long lines.
 
3893
ac_delim='%!_!# '
 
3894
for ac_last_try in false false :; do
 
3895
  ac_t=`sed -n "/$ac_delim/p" confdefs.h`
 
3896
  if test -z "$ac_t"; then
 
3897
    break
 
3898
  elif $ac_last_try; then
 
3899
    as_fn_error "could not make $CONFIG_HEADERS" "$LINENO" 5
 
3900
  else
 
3901
    ac_delim="$ac_delim!$ac_delim _$ac_delim!! "
 
3902
  fi
 
3903
done
 
3904
 
 
3905
# For the awk script, D is an array of macro values keyed by name,
 
3906
# likewise P contains macro parameters if any.  Preserve backslash
 
3907
# newline sequences.
 
3908
 
 
3909
ac_word_re=[_$as_cr_Letters][_$as_cr_alnum]*
 
3910
sed -n '
 
3911
s/.\{148\}/&'"$ac_delim"'/g
 
3912
t rset
 
3913
:rset
 
3914
s/^[     ]*#[    ]*define[       ][      ]*/ /
 
3915
t def
 
3916
d
 
3917
:def
 
3918
s/\\$//
 
3919
t bsnl
 
3920
s/["\\]/\\&/g
 
3921
s/^ \('"$ac_word_re"'\)\(([^()]*)\)[     ]*\(.*\)/P["\1"]="\2"\
 
3922
D["\1"]=" \3"/p
 
3923
s/^ \('"$ac_word_re"'\)[         ]*\(.*\)/D["\1"]=" \2"/p
 
3924
d
 
3925
:bsnl
 
3926
s/["\\]/\\&/g
 
3927
s/^ \('"$ac_word_re"'\)\(([^()]*)\)[     ]*\(.*\)/P["\1"]="\2"\
 
3928
D["\1"]=" \3\\\\\\n"\\/p
 
3929
t cont
 
3930
s/^ \('"$ac_word_re"'\)[         ]*\(.*\)/D["\1"]=" \2\\\\\\n"\\/p
 
3931
t cont
 
3932
d
 
3933
:cont
 
3934
n
 
3935
s/.\{148\}/&'"$ac_delim"'/g
 
3936
t clear
 
3937
:clear
 
3938
s/\\$//
 
3939
t bsnlc
 
3940
s/["\\]/\\&/g; s/^/"/; s/$/"/p
 
3941
d
 
3942
:bsnlc
 
3943
s/["\\]/\\&/g; s/^/"/; s/$/\\\\\\n"\\/p
 
3944
b cont
 
3945
' <confdefs.h | sed '
 
3946
s/'"$ac_delim"'/"\\\
 
3947
"/g' >>$CONFIG_STATUS || ac_write_fail=1
 
3948
 
 
3949
cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
 
3950
  for (key in D) D_is_set[key] = 1
 
3951
  FS = ""
 
3952
}
 
3953
/^[\t ]*#[\t ]*(define|undef)[\t ]+$ac_word_re([\t (]|\$)/ {
 
3954
  line = \$ 0
 
3955
  split(line, arg, " ")
 
3956
  if (arg[1] == "#") {
 
3957
    defundef = arg[2]
 
3958
    mac1 = arg[3]
 
3959
  } else {
 
3960
    defundef = substr(arg[1], 2)
 
3961
    mac1 = arg[2]
 
3962
  }
 
3963
  split(mac1, mac2, "(") #)
 
3964
  macro = mac2[1]
 
3965
  prefix = substr(line, 1, index(line, defundef) - 1)
 
3966
  if (D_is_set[macro]) {
 
3967
    # Preserve the white space surrounding the "#".
 
3968
    print prefix "define", macro P[macro] D[macro]
 
3969
    next
 
3970
  } else {
 
3971
    # Replace #undef with comments.  This is necessary, for example,
 
3972
    # in the case of _POSIX_SOURCE, which is predefined and required
 
3973
    # on some systems where configure will not decide to define it.
 
3974
    if (defundef == "undef") {
 
3975
      print "/*", prefix defundef, macro, "*/"
 
3976
      next
 
3977
    }
 
3978
  }
 
3979
}
 
3980
{ print }
 
3981
_ACAWK
 
3982
_ACEOF
 
3983
cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
 
3984
  as_fn_error "could not setup config headers machinery" "$LINENO" 5
 
3985
fi # test -n "$CONFIG_HEADERS"
 
3986
 
 
3987
 
 
3988
eval set X "    :H $CONFIG_HEADERS    "
 
3989
shift
 
3990
for ac_tag
 
3991
do
 
3992
  case $ac_tag in
 
3993
  :[FHLC]) ac_mode=$ac_tag; continue;;
 
3994
  esac
 
3995
  case $ac_mode$ac_tag in
 
3996
  :[FHL]*:*);;
 
3997
  :L* | :C*:*) as_fn_error "invalid tag \`$ac_tag'" "$LINENO" 5;;
 
3998
  :[FH]-) ac_tag=-:-;;
 
3999
  :[FH]*) ac_tag=$ac_tag:$ac_tag.in;;
 
4000
  esac
 
4001
  ac_save_IFS=$IFS
 
4002
  IFS=:
 
4003
  set x $ac_tag
 
4004
  IFS=$ac_save_IFS
 
4005
  shift
 
4006
  ac_file=$1
 
4007
  shift
 
4008
 
 
4009
  case $ac_mode in
 
4010
  :L) ac_source=$1;;
 
4011
  :[FH])
 
4012
    ac_file_inputs=
 
4013
    for ac_f
 
4014
    do
 
4015
      case $ac_f in
 
4016
      -) ac_f="$tmp/stdin";;
 
4017
      *) # Look for the file first in the build tree, then in the source tree
 
4018
         # (if the path is not absolute).  The absolute path cannot be DOS-style,
 
4019
         # because $ac_f cannot contain `:'.
 
4020
         test -f "$ac_f" ||
 
4021
           case $ac_f in
 
4022
           [\\/$]*) false;;
 
4023
           *) test -f "$srcdir/$ac_f" && ac_f="$srcdir/$ac_f";;
 
4024
           esac ||
 
4025
           as_fn_error "cannot find input file: \`$ac_f'" "$LINENO" 5;;
 
4026
      esac
 
4027
      case $ac_f in *\'*) ac_f=`$as_echo "$ac_f" | sed "s/'/'\\\\\\\\''/g"`;; esac
 
4028
      as_fn_append ac_file_inputs " '$ac_f'"
 
4029
    done
 
4030
 
 
4031
    # Let's still pretend it is `configure' which instantiates (i.e., don't
 
4032
    # use $as_me), people would be surprised to read:
 
4033
    #    /* config.h.  Generated by config.status.  */
 
4034
    configure_input='Generated from '`
 
4035
          $as_echo "$*" | sed 's|^[^:]*/||;s|:[^:]*/|, |g'
 
4036
        `' by configure.'
 
4037
    if test x"$ac_file" != x-; then
 
4038
      configure_input="$ac_file.  $configure_input"
 
4039
      { $as_echo "$as_me:${as_lineno-$LINENO}: creating $ac_file" >&5
 
4040
$as_echo "$as_me: creating $ac_file" >&6;}
 
4041
    fi
 
4042
    # Neutralize special characters interpreted by sed in replacement strings.
 
4043
    case $configure_input in #(
 
4044
    *\&* | *\|* | *\\* )
 
4045
       ac_sed_conf_input=`$as_echo "$configure_input" |
 
4046
       sed 's/[\\\\&|]/\\\\&/g'`;; #(
 
4047
    *) ac_sed_conf_input=$configure_input;;
 
4048
    esac
 
4049
 
 
4050
    case $ac_tag in
 
4051
    *:-:* | *:-) cat >"$tmp/stdin" \
 
4052
      || as_fn_error "could not create $ac_file" "$LINENO" 5 ;;
 
4053
    esac
 
4054
    ;;
 
4055
  esac
 
4056
 
 
4057
  ac_dir=`$as_dirname -- "$ac_file" ||
 
4058
$as_expr X"$ac_file" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
 
4059
         X"$ac_file" : 'X\(//\)[^/]' \| \
 
4060
         X"$ac_file" : 'X\(//\)$' \| \
 
4061
         X"$ac_file" : 'X\(/\)' \| . 2>/dev/null ||
 
4062
$as_echo X"$ac_file" |
 
4063
    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
 
4064
            s//\1/
 
4065
            q
 
4066
          }
 
4067
          /^X\(\/\/\)[^/].*/{
 
4068
            s//\1/
 
4069
            q
 
4070
          }
 
4071
          /^X\(\/\/\)$/{
 
4072
            s//\1/
 
4073
            q
 
4074
          }
 
4075
          /^X\(\/\).*/{
 
4076
            s//\1/
 
4077
            q
 
4078
          }
 
4079
          s/.*/./; q'`
 
4080
  as_dir="$ac_dir"; as_fn_mkdir_p
 
4081
  ac_builddir=.
 
4082
 
 
4083
case "$ac_dir" in
 
4084
.) ac_dir_suffix= ac_top_builddir_sub=. ac_top_build_prefix= ;;
 
4085
*)
 
4086
  ac_dir_suffix=/`$as_echo "$ac_dir" | sed 's|^\.[\\/]||'`
 
4087
  # A ".." for each directory in $ac_dir_suffix.
 
4088
  ac_top_builddir_sub=`$as_echo "$ac_dir_suffix" | sed 's|/[^\\/]*|/..|g;s|/||'`
 
4089
  case $ac_top_builddir_sub in
 
4090
  "") ac_top_builddir_sub=. ac_top_build_prefix= ;;
 
4091
  *)  ac_top_build_prefix=$ac_top_builddir_sub/ ;;
 
4092
  esac ;;
 
4093
esac
 
4094
ac_abs_top_builddir=$ac_pwd
 
4095
ac_abs_builddir=$ac_pwd$ac_dir_suffix
 
4096
# for backward compatibility:
 
4097
ac_top_builddir=$ac_top_build_prefix
 
4098
 
 
4099
case $srcdir in
 
4100
  .)  # We are building in place.
 
4101
    ac_srcdir=.
 
4102
    ac_top_srcdir=$ac_top_builddir_sub
 
4103
    ac_abs_top_srcdir=$ac_pwd ;;
 
4104
  [\\/]* | ?:[\\/]* )  # Absolute name.
 
4105
    ac_srcdir=$srcdir$ac_dir_suffix;
 
4106
    ac_top_srcdir=$srcdir
 
4107
    ac_abs_top_srcdir=$srcdir ;;
 
4108
  *) # Relative name.
 
4109
    ac_srcdir=$ac_top_build_prefix$srcdir$ac_dir_suffix
 
4110
    ac_top_srcdir=$ac_top_build_prefix$srcdir
 
4111
    ac_abs_top_srcdir=$ac_pwd/$srcdir ;;
 
4112
esac
 
4113
ac_abs_srcdir=$ac_abs_top_srcdir$ac_dir_suffix
 
4114
 
 
4115
 
 
4116
  case $ac_mode in
 
4117
 
 
4118
  :H)
 
4119
  #
 
4120
  # CONFIG_HEADER
 
4121
  #
 
4122
  if test x"$ac_file" != x-; then
 
4123
    {
 
4124
      $as_echo "/* $configure_input  */" \
 
4125
      && eval '$AWK -f "$tmp/defines.awk"' "$ac_file_inputs"
 
4126
    } >"$tmp/config.h" \
 
4127
      || as_fn_error "could not create $ac_file" "$LINENO" 5
 
4128
    if diff "$ac_file" "$tmp/config.h" >/dev/null 2>&1; then
 
4129
      { $as_echo "$as_me:${as_lineno-$LINENO}: $ac_file is unchanged" >&5
 
4130
$as_echo "$as_me: $ac_file is unchanged" >&6;}
 
4131
    else
 
4132
      rm -f "$ac_file"
 
4133
      mv "$tmp/config.h" "$ac_file" \
 
4134
        || as_fn_error "could not create $ac_file" "$LINENO" 5
 
4135
    fi
 
4136
  else
 
4137
    $as_echo "/* $configure_input  */" \
 
4138
      && eval '$AWK -f "$tmp/defines.awk"' "$ac_file_inputs" \
 
4139
      || as_fn_error "could not create -" "$LINENO" 5
 
4140
  fi
 
4141
 ;;
 
4142
 
 
4143
 
 
4144
  esac
 
4145
 
 
4146
done # for ac_tag
 
4147
 
 
4148
 
 
4149
as_fn_exit 0
 
4150
_ACEOF
 
4151
ac_clean_files=$ac_clean_files_save
 
4152
 
 
4153
test $ac_write_fail = 0 ||
 
4154
  as_fn_error "write failure creating $CONFIG_STATUS" "$LINENO" 5
 
4155
 
 
4156
 
 
4157
# configure is writing to config.log, and then calls config.status.
 
4158
# config.status does its own redirection, appending to config.log.
 
4159
# Unfortunately, on DOS this fails, as config.log is still kept open
 
4160
# by configure, so config.status won't be able to write to it; its
 
4161
# output is simply discarded.  So we exec the FD to /dev/null,
 
4162
# effectively closing config.log, so it can be properly (re)opened and
 
4163
# appended to by config.status.  When coming back to configure, we
 
4164
# need to make the FD available again.
 
4165
if test "$no_create" != yes; then
 
4166
  ac_cs_success=:
 
4167
  ac_config_status_args=
 
4168
  test "$silent" = yes &&
 
4169
    ac_config_status_args="$ac_config_status_args --quiet"
 
4170
  exec 5>/dev/null
 
4171
  $SHELL $CONFIG_STATUS $ac_config_status_args || ac_cs_success=false
 
4172
  exec 5>>config.log
 
4173
  # Use ||, not &&, to avoid exiting from the if with $? = 1, which
 
4174
  # would make configure fail if this is the last instruction.
 
4175
  $ac_cs_success || as_fn_exit $?
 
4176
fi
 
4177
if test -n "$ac_unrecognized_opts" && test "$enable_option_checking" != no; then
 
4178
  { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: unrecognized options: $ac_unrecognized_opts" >&5
 
4179
$as_echo "$as_me: WARNING: unrecognized options: $ac_unrecognized_opts" >&2;}
 
4180
fi
 
4181