Tom Sherman authored on 12/06/2018 19:33:39
Showing 32 changed files

... ...
@@ -32,4 +32,5 @@
32 32
 ^src/cpp_tests/testGibbsSampler.o
33 33
 ^src/cpp_tests/testMatrix.o
34 34
 ^src/cpp_tests/testProposalQueue.o
35
-^src/cpp_tests/testRandom.o
36 35
\ No newline at end of file
36
+^src/cpp_tests/testRandom.o
37
+^src/cpp_tests/testSerialization.o
37 38
\ No newline at end of file
38 39
deleted file mode 100644
... ...
@@ -1,26 +0,0 @@
1
-# options file for running astyle to "beautify" c++ code
2
-# run using `astyle --options=.astylerc src/*.{cc,cpp,h}`
3
-
4
-# use 4 spaces instead of tabs
5
-indent=spaces=4
6
-convert-tabs
7
-
8
-# remove spaces in and around parenthesis except in front of headers
9
-# Example: foo ( bar, baz ); -> foo(bar, baz);
10
-unpad-paren
11
-
12
-# insert a space after if, while, for, etc (exception to previous rule)
13
-pad-header
14
-
15
-# pointer and reference operators to name
16
-align-pointer=name
17
-
18
-# ALWAYS use brackets, even if the conditional is one line
19
-# if not and you add more code later you can have problems...
20
-add-brackets
21
-
22
-# use linux line-endings
23
-lineend=linux
24
-
25
-# restrict lines to 80 characters
26
-max-code-length=120
27 0
deleted file mode 100644
... ...
@@ -1,13 +0,0 @@
1
-linters: with_defaults(
2
-    camel_case_linter = NULL, # 1066
3
-    assignment_linter = NULL, # 239
4
-    infix_spaces_linter = NULL, # 150
5
-    open_curly_linter = NULL, # 113
6
-    line_length_linter = NULL, # 111
7
-    spaces_left_parentheses_linter = NULL, # 53
8
-    single_quotes_linter = NULL, # 33
9
-    commented_code_linter = NULL, # 6
10
-    commas_linter = NULL,
11
-    NULL
12
-  )
13
-exclusions: list("R/RcppExports.R")
... ...
@@ -42,7 +42,7 @@
42 42
 #' data(SimpSim)
43 43
 #' result <- CoGAPS(SimpSim.D, SimpSim.S, nFactor=3, nOutputs=250)
44 44
 #' @export
45
-CoGAPS <- function(D, S, nFactor=7, nEquil=1000, nSample=1000, nOutputs=1000,
45
+CoGAPS <- function(D, S, nFactor=7, nEquil=250, nSample=250, nOutputs=1000,
46 46
 nSnapshots=0, alphaA=0.01, alphaP=0.01, maxGibbmassA=100, maxGibbmassP=100,
47 47
 seed=-1, messages=TRUE, singleCellRNASeq=FALSE, whichMatrixFixed='N',
48 48
 fixedPatterns=matrix(0), checkpointInterval=0, 
... ...
@@ -114,6 +114,7 @@ checkpointFile="gaps_checkpoint.out", nCores=1, ...)
114 114
 }
115 115
 
116 116
 #' Restart CoGAPS from Checkpoint File
117
+#' @export
117 118
 #'
118 119
 #' @details loads the state of a previous CoGAPS run from a file and
119 120
 #'  continues the run from that point
... ...
@@ -122,6 +123,9 @@ checkpointFile="gaps_checkpoint.out", nCores=1, ...)
122 123
 #' @param path path to checkpoint file
123 124
 #' @param checkpointFile name for future checkpooints made
124 125
 #' @return list with A and P matrix estimates
126
+#' @examples
127
+#' data(SimpSim)
128
+#' result <- CoGAPS(SimpSim.D, SimpSim.S, nFactor=3, nOutputs=250)
125 129
 CoGapsFromCheckpoint <- function(D, S, path, checkpointFile=NA)
126 130
 {
127 131
     if (is.na(checkpointFile))
... ...
@@ -103,4 +103,4 @@ NULL
103 103
 #' @docType data
104 104
 #' @name tf2ugFC
105 105
 #' @usage tf2ugFC
106
-NULL
107 106
\ No newline at end of file
107
+NULL
... ...
@@ -46,4 +46,4 @@ plotGAPS <- function(A, P, outputPDF="")
46 46
     {
47 47
         dev.off()
48 48
     }
49
-}
50 49
\ No newline at end of file
50
+}
51 51
new file mode 100644
... ...
@@ -0,0 +1,5644 @@
1
+#! /bin/sh
2
+# Guess values for system-dependent variables and create Makefiles.
3
+# Generated by GNU Autoconf 2.69 for CoGAPS 3.1.2.
4
+#
5
+#
6
+# Copyright (C) 1992-1996, 1998-2012 Free Software Foundation, Inc.
7
+#
8
+#
9
+# This configure script is free software; the Free Software Foundation
10
+# gives unlimited permission to copy, distribute and modify it.
11
+## -------------------- ##
12
+## M4sh Initialization. ##
13
+## -------------------- ##
14
+
15
+# Be more Bourne compatible
16
+DUALCASE=1; export DUALCASE # for MKS sh
17
+if test -n "${ZSH_VERSION+set}" && (emulate sh) >/dev/null 2>&1; then :
18
+  emulate sh
19
+  NULLCMD=:
20
+  # Pre-4.2 versions of Zsh do word splitting on ${1+"$@"}, which
21
+  # is contrary to our usage.  Disable this feature.
22
+  alias -g '${1+"$@"}'='"$@"'
23
+  setopt NO_GLOB_SUBST
24
+else
25
+  case `(set -o) 2>/dev/null` in #(
26
+  *posix*) :
27
+    set -o posix ;; #(
28
+  *) :
29
+     ;;
30
+esac
31
+fi
32
+
33
+
34
+as_nl='
35
+'
36
+export as_nl
37
+# Printing a long string crashes Solaris 7 /usr/bin/printf.
38
+as_echo='\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\'
39
+as_echo=$as_echo$as_echo$as_echo$as_echo$as_echo
40
+as_echo=$as_echo$as_echo$as_echo$as_echo$as_echo$as_echo
41
+# Prefer a ksh shell builtin over an external printf program on Solaris,
42
+# but without wasting forks for bash or zsh.
43
+if test -z "$BASH_VERSION$ZSH_VERSION" \
44
+    && (test "X`print -r -- $as_echo`" = "X$as_echo") 2>/dev/null; then
45
+  as_echo='print -r --'
46
+  as_echo_n='print -rn --'
47
+elif (test "X`printf %s $as_echo`" = "X$as_echo") 2>/dev/null; then
48
+  as_echo='printf %s\n'
49
+  as_echo_n='printf %s'
50
+else
51
+  if test "X`(/usr/ucb/echo -n -n $as_echo) 2>/dev/null`" = "X-n $as_echo"; then
52
+    as_echo_body='eval /usr/ucb/echo -n "$1$as_nl"'
53
+    as_echo_n='/usr/ucb/echo -n'
54
+  else
55
+    as_echo_body='eval expr "X$1" : "X\\(.*\\)"'
56
+    as_echo_n_body='eval
57
+      arg=$1;
58
+      case $arg in #(
59
+      *"$as_nl"*)
60
+	expr "X$arg" : "X\\(.*\\)$as_nl";
61
+	arg=`expr "X$arg" : ".*$as_nl\\(.*\\)"`;;
62
+      esac;
63
+      expr "X$arg" : "X\\(.*\\)" | tr -d "$as_nl"
64
+    '
65
+    export as_echo_n_body
66
+    as_echo_n='sh -c $as_echo_n_body as_echo'
67
+  fi
68
+  export as_echo_body
69
+  as_echo='sh -c $as_echo_body as_echo'
70
+fi
71
+
72
+# The user is always right.
73
+if test "${PATH_SEPARATOR+set}" != set; then
74
+  PATH_SEPARATOR=:
75
+  (PATH='/bin;/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 && {
76
+    (PATH='/bin:/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 ||
77
+      PATH_SEPARATOR=';'
78
+  }
79
+fi
80
+
81
+
82
+# IFS
83
+# We need space, tab and new line, in precisely that order.  Quoting is
84
+# there to prevent editors from complaining about space-tab.
85
+# (If _AS_PATH_WALK were called with IFS unset, it would disable word
86
+# splitting by setting IFS to empty value.)
87
+IFS=" ""	$as_nl"
88
+
89
+# Find who we are.  Look in the path if we contain no directory separator.
90
+as_myself=
91
+case $0 in #((
92
+  *[\\/]* ) as_myself=$0 ;;
93
+  *) as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
94
+for as_dir in $PATH
95
+do
96
+  IFS=$as_save_IFS
97
+  test -z "$as_dir" && as_dir=.
98
+    test -r "$as_dir/$0" && as_myself=$as_dir/$0 && break
99
+  done
100
+IFS=$as_save_IFS
101
+
102
+     ;;
103
+esac
104
+# We did not find ourselves, most probably we were run as `sh COMMAND'
105
+# in which case we are not to be found in the path.
106
+if test "x$as_myself" = x; then
107
+  as_myself=$0
108
+fi
109
+if test ! -f "$as_myself"; then
110
+  $as_echo "$as_myself: error: cannot find myself; rerun with an absolute file name" >&2
111
+  exit 1
112
+fi
113
+
114
+# Unset variables that we do not need and which cause bugs (e.g. in
115
+# pre-3.0 UWIN ksh).  But do not cause bugs in bash 2.01; the "|| exit 1"
116
+# suppresses any "Segmentation fault" message there.  '((' could
117
+# trigger a bug in pdksh 5.2.14.
118
+for as_var in BASH_ENV ENV MAIL MAILPATH
119
+do eval test x\${$as_var+set} = xset \
120
+  && ( (unset $as_var) || exit 1) >/dev/null 2>&1 && unset $as_var || :
121
+done
122
+PS1='$ '
123
+PS2='> '
124
+PS4='+ '
125
+
126
+# NLS nuisances.
127
+LC_ALL=C
128
+export LC_ALL
129
+LANGUAGE=C
130
+export LANGUAGE
131
+
132
+# CDPATH.
133
+(unset CDPATH) >/dev/null 2>&1 && unset CDPATH
134
+
135
+# Use a proper internal environment variable to ensure we don't fall
136
+  # into an infinite loop, continuously re-executing ourselves.
137
+  if test x"${_as_can_reexec}" != xno && test "x$CONFIG_SHELL" != x; then
138
+    _as_can_reexec=no; export _as_can_reexec;
139
+    # We cannot yet assume a decent shell, so we have to provide a
140
+# neutralization value for shells without unset; and this also
141
+# works around shells that cannot unset nonexistent variables.
142
+# Preserve -v and -x to the replacement shell.
143
+BASH_ENV=/dev/null
144
+ENV=/dev/null
145
+(unset BASH_ENV) >/dev/null 2>&1 && unset BASH_ENV ENV
146
+case $- in # ((((
147
+  *v*x* | *x*v* ) as_opts=-vx ;;
148
+  *v* ) as_opts=-v ;;
149
+  *x* ) as_opts=-x ;;
150
+  * ) as_opts= ;;
151
+esac
152
+exec $CONFIG_SHELL $as_opts "$as_myself" ${1+"$@"}
153
+# Admittedly, this is quite paranoid, since all the known shells bail
154
+# out after a failed `exec'.
155
+$as_echo "$0: could not re-execute with $CONFIG_SHELL" >&2
156
+as_fn_exit 255
157
+  fi
158
+  # We don't want this to propagate to other subprocesses.
159
+          { _as_can_reexec=; unset _as_can_reexec;}
160
+if test "x$CONFIG_SHELL" = x; then
161
+  as_bourne_compatible="if test -n \"\${ZSH_VERSION+set}\" && (emulate sh) >/dev/null 2>&1; then :
162
+  emulate sh
163
+  NULLCMD=:
164
+  # Pre-4.2 versions of Zsh do word splitting on \${1+\"\$@\"}, which
165
+  # is contrary to our usage.  Disable this feature.
166
+  alias -g '\${1+\"\$@\"}'='\"\$@\"'
167
+  setopt NO_GLOB_SUBST
168
+else
169
+  case \`(set -o) 2>/dev/null\` in #(
170
+  *posix*) :
171
+    set -o posix ;; #(
172
+  *) :
173
+     ;;
174
+esac
175
+fi
176
+"
177
+  as_required="as_fn_return () { (exit \$1); }
178
+as_fn_success () { as_fn_return 0; }
179
+as_fn_failure () { as_fn_return 1; }
180
+as_fn_ret_success () { return 0; }
181
+as_fn_ret_failure () { return 1; }
182
+
183
+exitcode=0
184
+as_fn_success || { exitcode=1; echo as_fn_success failed.; }
185
+as_fn_failure && { exitcode=1; echo as_fn_failure succeeded.; }
186
+as_fn_ret_success || { exitcode=1; echo as_fn_ret_success failed.; }
187
+as_fn_ret_failure && { exitcode=1; echo as_fn_ret_failure succeeded.; }
188
+if ( set x; as_fn_ret_success y && test x = \"\$1\" ); then :
189
+
190
+else
191
+  exitcode=1; echo positional parameters were not saved.
192
+fi
193
+test x\$exitcode = x0 || exit 1
194
+test -x / || exit 1"
195
+  as_suggested="  as_lineno_1=";as_suggested=$as_suggested$LINENO;as_suggested=$as_suggested" as_lineno_1a=\$LINENO
196
+  as_lineno_2=";as_suggested=$as_suggested$LINENO;as_suggested=$as_suggested" as_lineno_2a=\$LINENO
197
+  eval 'test \"x\$as_lineno_1'\$as_run'\" != \"x\$as_lineno_2'\$as_run'\" &&
198
+  test \"x\`expr \$as_lineno_1'\$as_run' + 1\`\" = \"x\$as_lineno_2'\$as_run'\"' || exit 1
199
+test \$(( 1 + 1 )) = 2 || exit 1"
200
+  if (eval "$as_required") 2>/dev/null; then :
201
+  as_have_required=yes
202
+else
203
+  as_have_required=no
204
+fi
205
+  if test x$as_have_required = xyes && (eval "$as_suggested") 2>/dev/null; then :
206
+
207
+else
208
+  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
209
+as_found=false
210
+for as_dir in /bin$PATH_SEPARATOR/usr/bin$PATH_SEPARATOR$PATH
211
+do
212
+  IFS=$as_save_IFS
213
+  test -z "$as_dir" && as_dir=.
214
+  as_found=:
215
+  case $as_dir in #(
216
+	 /*)
217
+	   for as_base in sh bash ksh sh5; do
218
+	     # Try only shells that exist, to save several forks.
219
+	     as_shell=$as_dir/$as_base
220
+	     if { test -f "$as_shell" || test -f "$as_shell.exe"; } &&
221
+		    { $as_echo "$as_bourne_compatible""$as_required" | as_run=a "$as_shell"; } 2>/dev/null; then :
222
+  CONFIG_SHELL=$as_shell as_have_required=yes
223
+		   if { $as_echo "$as_bourne_compatible""$as_suggested" | as_run=a "$as_shell"; } 2>/dev/null; then :
224
+  break 2
225
+fi
226
+fi
227
+	   done;;
228
+       esac
229
+  as_found=false
230
+done
231
+$as_found || { if { test -f "$SHELL" || test -f "$SHELL.exe"; } &&
232
+	      { $as_echo "$as_bourne_compatible""$as_required" | as_run=a "$SHELL"; } 2>/dev/null; then :
233
+  CONFIG_SHELL=$SHELL as_have_required=yes
234
+fi; }
235
+IFS=$as_save_IFS
236
+
237
+
238
+      if test "x$CONFIG_SHELL" != x; then :
239
+  export CONFIG_SHELL
240
+             # We cannot yet assume a decent shell, so we have to provide a
241
+# neutralization value for shells without unset; and this also
242
+# works around shells that cannot unset nonexistent variables.
243
+# Preserve -v and -x to the replacement shell.
244
+BASH_ENV=/dev/null
245
+ENV=/dev/null
246
+(unset BASH_ENV) >/dev/null 2>&1 && unset BASH_ENV ENV
247
+case $- in # ((((
248
+  *v*x* | *x*v* ) as_opts=-vx ;;
249
+  *v* ) as_opts=-v ;;
250
+  *x* ) as_opts=-x ;;
251
+  * ) as_opts= ;;
252
+esac
253
+exec $CONFIG_SHELL $as_opts "$as_myself" ${1+"$@"}
254
+# Admittedly, this is quite paranoid, since all the known shells bail
255
+# out after a failed `exec'.
256
+$as_echo "$0: could not re-execute with $CONFIG_SHELL" >&2
257
+exit 255
258
+fi
259
+
260
+    if test x$as_have_required = xno; then :
261
+  $as_echo "$0: This script requires a shell more modern than all"
262
+  $as_echo "$0: the shells that I found on your system."
263
+  if test x${ZSH_VERSION+set} = xset ; then
264
+    $as_echo "$0: In particular, zsh $ZSH_VERSION has bugs and should"
265
+    $as_echo "$0: be upgraded to zsh 4.3.4 or later."
266
+  else
267
+    $as_echo "$0: Please tell bug-autoconf@gnu.org about your system,
268
+$0: including any error possibly output before this
269
+$0: message. Then install a modern shell, or manually run
270
+$0: the script under such a shell if you do have one."
271
+  fi
272
+  exit 1
273
+fi
274
+fi
275
+fi
276
+SHELL=${CONFIG_SHELL-/bin/sh}
277
+export SHELL
278
+# Unset more variables known to interfere with behavior of common tools.
279
+CLICOLOR_FORCE= GREP_OPTIONS=
280
+unset CLICOLOR_FORCE GREP_OPTIONS
281
+
282
+## --------------------- ##
283
+## M4sh Shell Functions. ##
284
+## --------------------- ##
285
+# as_fn_unset VAR
286
+# ---------------
287
+# Portably unset VAR.
288
+as_fn_unset ()
289
+{
290
+  { eval $1=; unset $1;}
291
+}
292
+as_unset=as_fn_unset
293
+
294
+# as_fn_set_status STATUS
295
+# -----------------------
296
+# Set $? to STATUS, without forking.
297
+as_fn_set_status ()
298
+{
299
+  return $1
300
+} # as_fn_set_status
301
+
302
+# as_fn_exit STATUS
303
+# -----------------
304
+# Exit the shell with STATUS, even in a "trap 0" or "set -e" context.
305
+as_fn_exit ()
306
+{
307
+  set +e
308
+  as_fn_set_status $1
309
+  exit $1
310
+} # as_fn_exit
311
+
312
+# as_fn_mkdir_p
313
+# -------------
314
+# Create "$as_dir" as a directory, including parents if necessary.
315
+as_fn_mkdir_p ()
316
+{
317
+
318
+  case $as_dir in #(
319
+  -*) as_dir=./$as_dir;;
320
+  esac
321
+  test -d "$as_dir" || eval $as_mkdir_p || {
322
+    as_dirs=
323
+    while :; do
324
+      case $as_dir in #(
325
+      *\'*) as_qdir=`$as_echo "$as_dir" | sed "s/'/'\\\\\\\\''/g"`;; #'(
326
+      *) as_qdir=$as_dir;;
327
+      esac
328
+      as_dirs="'$as_qdir' $as_dirs"
329
+      as_dir=`$as_dirname -- "$as_dir" ||
330
+$as_expr X"$as_dir" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
331
+	 X"$as_dir" : 'X\(//\)[^/]' \| \
332
+	 X"$as_dir" : 'X\(//\)$' \| \
333
+	 X"$as_dir" : 'X\(/\)' \| . 2>/dev/null ||
334
+$as_echo X"$as_dir" |
335
+    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
336
+	    s//\1/
337
+	    q
338
+	  }
339
+	  /^X\(\/\/\)[^/].*/{
340
+	    s//\1/
341
+	    q
342
+	  }
343
+	  /^X\(\/\/\)$/{
344
+	    s//\1/
345
+	    q
346
+	  }
347
+	  /^X\(\/\).*/{
348
+	    s//\1/
349
+	    q
350
+	  }
351
+	  s/.*/./; q'`
352
+      test -d "$as_dir" && break
353
+    done
354
+    test -z "$as_dirs" || eval "mkdir $as_dirs"
355
+  } || test -d "$as_dir" || as_fn_error $? "cannot create directory $as_dir"
356
+
357
+
358
+} # as_fn_mkdir_p
359
+
360
+# as_fn_executable_p FILE
361
+# -----------------------
362
+# Test if FILE is an executable regular file.
363
+as_fn_executable_p ()
364
+{
365
+  test -f "$1" && test -x "$1"
366
+} # as_fn_executable_p
367
+# as_fn_append VAR VALUE
368
+# ----------------------
369
+# Append the text in VALUE to the end of the definition contained in VAR. Take
370
+# advantage of any shell optimizations that allow amortized linear growth over
371
+# repeated appends, instead of the typical quadratic growth present in naive
372
+# implementations.
373
+if (eval "as_var=1; as_var+=2; test x\$as_var = x12") 2>/dev/null; then :
374
+  eval 'as_fn_append ()
375
+  {
376
+    eval $1+=\$2
377
+  }'
378
+else
379
+  as_fn_append ()
380
+  {
381
+    eval $1=\$$1\$2
382
+  }
383
+fi # as_fn_append
384
+
385
+# as_fn_arith ARG...
386
+# ------------------
387
+# Perform arithmetic evaluation on the ARGs, and store the result in the
388
+# global $as_val. Take advantage of shells that can avoid forks. The arguments
389
+# must be portable across $(()) and expr.
390
+if (eval "test \$(( 1 + 1 )) = 2") 2>/dev/null; then :
391
+  eval 'as_fn_arith ()
392
+  {
393
+    as_val=$(( $* ))
394
+  }'
395
+else
396
+  as_fn_arith ()
397
+  {
398
+    as_val=`expr "$@" || test $? -eq 1`
399
+  }
400
+fi # as_fn_arith
401
+
402
+
403
+# as_fn_error STATUS ERROR [LINENO LOG_FD]
404
+# ----------------------------------------
405
+# Output "`basename $0`: error: ERROR" to stderr. If LINENO and LOG_FD are
406
+# provided, also output the error to LOG_FD, referencing LINENO. Then exit the
407
+# script with STATUS, using 1 if that was 0.
408
+as_fn_error ()
409
+{
410
+  as_status=$1; test $as_status -eq 0 && as_status=1
411
+  if test "$4"; then
412
+    as_lineno=${as_lineno-"$3"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
413
+    $as_echo "$as_me:${as_lineno-$LINENO}: error: $2" >&$4
414
+  fi
415
+  $as_echo "$as_me: error: $2" >&2
416
+  as_fn_exit $as_status
417
+} # as_fn_error
418
+
419
+if expr a : '\(a\)' >/dev/null 2>&1 &&
420
+   test "X`expr 00001 : '.*\(...\)'`" = X001; then
421
+  as_expr=expr
422
+else
423
+  as_expr=false
424
+fi
425
+
426
+if (basename -- /) >/dev/null 2>&1 && test "X`basename -- / 2>&1`" = "X/"; then
427
+  as_basename=basename
428
+else
429
+  as_basename=false
430
+fi
431
+
432
+if (as_dir=`dirname -- /` && test "X$as_dir" = X/) >/dev/null 2>&1; then
433
+  as_dirname=dirname
434
+else
435
+  as_dirname=false
436
+fi
437
+
438
+as_me=`$as_basename -- "$0" ||
439
+$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
440
+	 X"$0" : 'X\(//\)$' \| \
441
+	 X"$0" : 'X\(/\)' \| . 2>/dev/null ||
442
+$as_echo X/"$0" |
443
+    sed '/^.*\/\([^/][^/]*\)\/*$/{
444
+	    s//\1/
445
+	    q
446
+	  }
447
+	  /^X\/\(\/\/\)$/{
448
+	    s//\1/
449
+	    q
450
+	  }
451
+	  /^X\/\(\/\).*/{
452
+	    s//\1/
453
+	    q
454
+	  }
455
+	  s/.*/./; q'`
456
+
457
+# Avoid depending upon Character Ranges.
458
+as_cr_letters='abcdefghijklmnopqrstuvwxyz'
459
+as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
460
+as_cr_Letters=$as_cr_letters$as_cr_LETTERS
461
+as_cr_digits='0123456789'
462
+as_cr_alnum=$as_cr_Letters$as_cr_digits
463
+
464
+
465
+  as_lineno_1=$LINENO as_lineno_1a=$LINENO
466
+  as_lineno_2=$LINENO as_lineno_2a=$LINENO
467
+  eval 'test "x$as_lineno_1'$as_run'" != "x$as_lineno_2'$as_run'" &&
468
+  test "x`expr $as_lineno_1'$as_run' + 1`" = "x$as_lineno_2'$as_run'"' || {
469
+  # Blame Lee E. McMahon (1931-1989) for sed's syntax.  :-)
470
+  sed -n '
471
+    p
472
+    /[$]LINENO/=
473
+  ' <$as_myself |
474
+    sed '
475
+      s/[$]LINENO.*/&-/
476
+      t lineno
477
+      b
478
+      :lineno
479
+      N
480
+      :loop
481
+      s/[$]LINENO\([^'$as_cr_alnum'_].*\n\)\(.*\)/\2\1\2/
482
+      t loop
483
+      s/-\n.*//
484
+    ' >$as_me.lineno &&
485
+  chmod +x "$as_me.lineno" ||
486
+    { $as_echo "$as_me: error: cannot create $as_me.lineno; rerun with a POSIX shell" >&2; as_fn_exit 1; }
487
+
488
+  # If we had to re-execute with $CONFIG_SHELL, we're ensured to have
489
+  # already done that, so ensure we don't try to do so again and fall
490
+  # in an infinite loop.  This has already happened in practice.
491
+  _as_can_reexec=no; export _as_can_reexec
492
+  # Don't try to exec as it changes $[0], causing all sort of problems
493
+  # (the dirname of $[0] is not the place where we might find the
494
+  # original and so on.  Autoconf is especially sensitive to this).
495
+  . "./$as_me.lineno"
496
+  # Exit status is that of the last command.
497
+  exit
498
+}
499
+
500
+ECHO_C= ECHO_N= ECHO_T=
501
+case `echo -n x` in #(((((
502
+-n*)
503
+  case `echo 'xy\c'` in
504
+  *c*) ECHO_T='	';;	# ECHO_T is single tab character.
505
+  xy)  ECHO_C='\c';;
506
+  *)   echo `echo ksh88 bug on AIX 6.1` > /dev/null
507
+       ECHO_T='	';;
508
+  esac;;
509
+*)
510
+  ECHO_N='-n';;
511
+esac
512
+
513
+rm -f conf$$ conf$$.exe conf$$.file
514
+if test -d conf$$.dir; then
515
+  rm -f conf$$.dir/conf$$.file
516
+else
517
+  rm -f conf$$.dir
518
+  mkdir conf$$.dir 2>/dev/null
519
+fi
520
+if (echo >conf$$.file) 2>/dev/null; then
521
+  if ln -s conf$$.file conf$$ 2>/dev/null; then
522
+    as_ln_s='ln -s'
523
+    # ... but there are two gotchas:
524
+    # 1) On MSYS, both `ln -s file dir' and `ln file dir' fail.
525
+    # 2) DJGPP < 2.04 has no symlinks; `ln -s' creates a wrapper executable.
526
+    # In both cases, we have to default to `cp -pR'.
527
+    ln -s conf$$.file conf$$.dir 2>/dev/null && test ! -f conf$$.exe ||
528
+      as_ln_s='cp -pR'
529
+  elif ln conf$$.file conf$$ 2>/dev/null; then
530
+    as_ln_s=ln
531
+  else
532
+    as_ln_s='cp -pR'
533
+  fi
534
+else
535
+  as_ln_s='cp -pR'
536
+fi
537
+rm -f conf$$ conf$$.exe conf$$.dir/conf$$.file conf$$.file
538
+rmdir conf$$.dir 2>/dev/null
539
+
540
+if mkdir -p . 2>/dev/null; then
541
+  as_mkdir_p='mkdir -p "$as_dir"'
542
+else
543
+  test -d ./-p && rmdir ./-p
544
+  as_mkdir_p=false
545
+fi
546
+
547
+as_test_x='test -x'
548
+as_executable_p=as_fn_executable_p
549
+
550
+# Sed expression to map a string onto a valid CPP name.
551
+as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
552
+
553
+# Sed expression to map a string onto a valid variable name.
554
+as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
555
+
556
+
557
+test -n "$DJDIR" || exec 7<&0 </dev/null
558
+exec 6>&1
559
+
560
+# Name of the host.
561
+# hostname on some systems (SVR3.2, old GNU/Linux) returns a bogus exit status,
562
+# so uname gets run too.
563
+ac_hostname=`(hostname || uname -n) 2>/dev/null | sed 1q`
564
+
565
+#
566
+# Initializations.
567
+#
568
+ac_default_prefix=/usr/local
569
+ac_clean_files=
570
+ac_config_libobj_dir=.
571
+LIBOBJS=
572
+cross_compiling=no
573
+subdirs=
574
+MFLAGS=
575
+MAKEFLAGS=
576
+
577
+# Identity of this package.
578
+PACKAGE_NAME='CoGAPS'
579
+PACKAGE_TARNAME='cogaps'
580
+PACKAGE_VERSION='3.1.2'
581
+PACKAGE_STRING='CoGAPS 3.1.2'
582
+PACKAGE_BUGREPORT=''
583
+PACKAGE_URL=''
584
+
585
+ac_subst_vars='LTLIBOBJS
586
+LIBOBJS
587
+GAPS_LIBS
588
+GAPS_CXX_FLAGS
589
+GAPS_CPP_FLAGS
590
+SED
591
+CXXCPP
592
+OBJEXT
593
+EXEEXT
594
+ac_ct_CXX
595
+CPPFLAGS
596
+LDFLAGS
597
+CXXFLAGS
598
+CXX
599
+target_alias
600
+host_alias
601
+build_alias
602
+LIBS
603
+ECHO_T
604
+ECHO_N
605
+ECHO_C
606
+DEFS
607
+mandir
608
+localedir
609
+libdir
610
+psdir
611
+pdfdir
612
+dvidir
613
+htmldir
614
+infodir
615
+docdir
616
+oldincludedir
617
+includedir
618
+runstatedir
619
+localstatedir
620
+sharedstatedir
621
+sysconfdir
622
+datadir
623
+datarootdir
624
+libexecdir
625
+sbindir
626
+bindir
627
+program_transform_name
628
+prefix
629
+exec_prefix
630
+PACKAGE_URL
631
+PACKAGE_BUGREPORT
632
+PACKAGE_STRING
633
+PACKAGE_VERSION
634
+PACKAGE_TARNAME
635
+PACKAGE_NAME
636
+PATH_SEPARATOR
637
+SHELL'
638
+ac_subst_files=''
639
+ac_user_opts='
640
+enable_option_checking
641
+enable_debug
642
+enable_warnings
643
+enable_simd
644
+'
645
+      ac_precious_vars='build_alias
646
+host_alias
647
+target_alias
648
+CXX
649
+CXXFLAGS
650
+LDFLAGS
651
+LIBS
652
+CPPFLAGS
653
+CCC
654
+CXXCPP'
655
+
656
+
657
+# Initialize some variables set by options.
658
+ac_init_help=
659
+ac_init_version=false
660
+ac_unrecognized_opts=
661
+ac_unrecognized_sep=
662
+# The variables have the same names as the options, with
663
+# dashes changed to underlines.
664
+cache_file=/dev/null
665
+exec_prefix=NONE
666
+no_create=
667
+no_recursion=
668
+prefix=NONE
669
+program_prefix=NONE
670
+program_suffix=NONE
671
+program_transform_name=s,x,x,
672
+silent=
673
+site=
674
+srcdir=
675
+verbose=
676
+x_includes=NONE
677
+x_libraries=NONE
678
+
679
+# Installation directory options.
680
+# These are left unexpanded so users can "make install exec_prefix=/foo"
681
+# and all the variables that are supposed to be based on exec_prefix
682
+# by default will actually change.
683
+# Use braces instead of parens because sh, perl, etc. also accept them.
684
+# (The list follows the same order as the GNU Coding Standards.)
685
+bindir='${exec_prefix}/bin'
686
+sbindir='${exec_prefix}/sbin'
687
+libexecdir='${exec_prefix}/libexec'
688
+datarootdir='${prefix}/share'
689
+datadir='${datarootdir}'
690
+sysconfdir='${prefix}/etc'
691
+sharedstatedir='${prefix}/com'
692
+localstatedir='${prefix}/var'
693
+runstatedir='${localstatedir}/run'
694
+includedir='${prefix}/include'
695
+oldincludedir='/usr/include'
696
+docdir='${datarootdir}/doc/${PACKAGE_TARNAME}'
697
+infodir='${datarootdir}/info'
698
+htmldir='${docdir}'
699
+dvidir='${docdir}'
700
+pdfdir='${docdir}'
701
+psdir='${docdir}'
702
+libdir='${exec_prefix}/lib'
703
+localedir='${datarootdir}/locale'
704
+mandir='${datarootdir}/man'
705
+
706
+ac_prev=
707
+ac_dashdash=
708
+for ac_option
709
+do
710
+  # If the previous option needs an argument, assign it.
711
+  if test -n "$ac_prev"; then
712
+    eval $ac_prev=\$ac_option
713
+    ac_prev=
714
+    continue
715
+  fi
716
+
717
+  case $ac_option in
718
+  *=?*) ac_optarg=`expr "X$ac_option" : '[^=]*=\(.*\)'` ;;
719
+  *=)   ac_optarg= ;;
720
+  *)    ac_optarg=yes ;;
721
+  esac
722
+
723
+  # Accept the important Cygnus configure options, so we can diagnose typos.
724
+
725
+  case $ac_dashdash$ac_option in
726
+  --)
727
+    ac_dashdash=yes ;;
728
+
729
+  -bindir | --bindir | --bindi | --bind | --bin | --bi)
730
+    ac_prev=bindir ;;
731
+  -bindir=* | --bindir=* | --bindi=* | --bind=* | --bin=* | --bi=*)
732
+    bindir=$ac_optarg ;;
733
+
734
+  -build | --build | --buil | --bui | --bu)
735
+    ac_prev=build_alias ;;
736
+  -build=* | --build=* | --buil=* | --bui=* | --bu=*)
737
+    build_alias=$ac_optarg ;;
738
+
739
+  -cache-file | --cache-file | --cache-fil | --cache-fi \
740
+  | --cache-f | --cache- | --cache | --cach | --cac | --ca | --c)
741
+    ac_prev=cache_file ;;
742
+  -cache-file=* | --cache-file=* | --cache-fil=* | --cache-fi=* \
743
+  | --cache-f=* | --cache-=* | --cache=* | --cach=* | --cac=* | --ca=* | --c=*)
744
+    cache_file=$ac_optarg ;;
745
+
746
+  --config-cache | -C)
747
+    cache_file=config.cache ;;
748
+
749
+  -datadir | --datadir | --datadi | --datad)
750
+    ac_prev=datadir ;;
751
+  -datadir=* | --datadir=* | --datadi=* | --datad=*)
752
+    datadir=$ac_optarg ;;
753
+
754
+  -datarootdir | --datarootdir | --datarootdi | --datarootd | --dataroot \
755
+  | --dataroo | --dataro | --datar)
756
+    ac_prev=datarootdir ;;
757
+  -datarootdir=* | --datarootdir=* | --datarootdi=* | --datarootd=* \
758
+  | --dataroot=* | --dataroo=* | --dataro=* | --datar=*)
759
+    datarootdir=$ac_optarg ;;
760
+
761
+  -disable-* | --disable-*)
762
+    ac_useropt=`expr "x$ac_option" : 'x-*disable-\(.*\)'`
763
+    # Reject names that are not valid shell variable names.
764
+    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
765
+      as_fn_error $? "invalid feature name: $ac_useropt"
766
+    ac_useropt_orig=$ac_useropt
767
+    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
768
+    case $ac_user_opts in
769
+      *"
770
+"enable_$ac_useropt"
771
+"*) ;;
772
+      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--disable-$ac_useropt_orig"
773
+	 ac_unrecognized_sep=', ';;
774
+    esac
775
+    eval enable_$ac_useropt=no ;;
776
+
777
+  -docdir | --docdir | --docdi | --doc | --do)
778
+    ac_prev=docdir ;;
779
+  -docdir=* | --docdir=* | --docdi=* | --doc=* | --do=*)
780
+    docdir=$ac_optarg ;;
781
+
782
+  -dvidir | --dvidir | --dvidi | --dvid | --dvi | --dv)
783
+    ac_prev=dvidir ;;
784
+  -dvidir=* | --dvidir=* | --dvidi=* | --dvid=* | --dvi=* | --dv=*)
785
+    dvidir=$ac_optarg ;;
786
+
787
+  -enable-* | --enable-*)
788
+    ac_useropt=`expr "x$ac_option" : 'x-*enable-\([^=]*\)'`
789
+    # Reject names that are not valid shell variable names.
790
+    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
791
+      as_fn_error $? "invalid feature name: $ac_useropt"
792
+    ac_useropt_orig=$ac_useropt
793
+    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
794
+    case $ac_user_opts in
795
+      *"
796
+"enable_$ac_useropt"
797
+"*) ;;
798
+      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--enable-$ac_useropt_orig"
799
+	 ac_unrecognized_sep=', ';;
800
+    esac
801
+    eval enable_$ac_useropt=\$ac_optarg ;;
802
+
803
+  -exec-prefix | --exec_prefix | --exec-prefix | --exec-prefi \
804
+  | --exec-pref | --exec-pre | --exec-pr | --exec-p | --exec- \
805
+  | --exec | --exe | --ex)
806
+    ac_prev=exec_prefix ;;
807
+  -exec-prefix=* | --exec_prefix=* | --exec-prefix=* | --exec-prefi=* \
808
+  | --exec-pref=* | --exec-pre=* | --exec-pr=* | --exec-p=* | --exec-=* \
809
+  | --exec=* | --exe=* | --ex=*)
810
+    exec_prefix=$ac_optarg ;;
811
+
812
+  -gas | --gas | --ga | --g)
813
+    # Obsolete; use --with-gas.
814
+    with_gas=yes ;;
815
+
816
+  -help | --help | --hel | --he | -h)
817
+    ac_init_help=long ;;
818
+  -help=r* | --help=r* | --hel=r* | --he=r* | -hr*)
819
+    ac_init_help=recursive ;;
820
+  -help=s* | --help=s* | --hel=s* | --he=s* | -hs*)
821
+    ac_init_help=short ;;
822
+
823
+  -host | --host | --hos | --ho)
824
+    ac_prev=host_alias ;;
825
+  -host=* | --host=* | --hos=* | --ho=*)
826
+    host_alias=$ac_optarg ;;
827
+
828
+  -htmldir | --htmldir | --htmldi | --htmld | --html | --htm | --ht)
829
+    ac_prev=htmldir ;;
830
+  -htmldir=* | --htmldir=* | --htmldi=* | --htmld=* | --html=* | --htm=* \
831
+  | --ht=*)
832
+    htmldir=$ac_optarg ;;
833
+
834
+  -includedir | --includedir | --includedi | --included | --include \
835
+  | --includ | --inclu | --incl | --inc)
836
+    ac_prev=includedir ;;
837
+  -includedir=* | --includedir=* | --includedi=* | --included=* | --include=* \
838
+  | --includ=* | --inclu=* | --incl=* | --inc=*)
839
+    includedir=$ac_optarg ;;
840
+
841
+  -infodir | --infodir | --infodi | --infod | --info | --inf)
842
+    ac_prev=infodir ;;
843
+  -infodir=* | --infodir=* | --infodi=* | --infod=* | --info=* | --inf=*)
844
+    infodir=$ac_optarg ;;
845
+
846
+  -libdir | --libdir | --libdi | --libd)
847
+    ac_prev=libdir ;;
848
+  -libdir=* | --libdir=* | --libdi=* | --libd=*)
849
+    libdir=$ac_optarg ;;
850
+
851
+  -libexecdir | --libexecdir | --libexecdi | --libexecd | --libexec \
852
+  | --libexe | --libex | --libe)
853
+    ac_prev=libexecdir ;;
854
+  -libexecdir=* | --libexecdir=* | --libexecdi=* | --libexecd=* | --libexec=* \
855
+  | --libexe=* | --libex=* | --libe=*)
856
+    libexecdir=$ac_optarg ;;
857
+
858
+  -localedir | --localedir | --localedi | --localed | --locale)
859
+    ac_prev=localedir ;;
860
+  -localedir=* | --localedir=* | --localedi=* | --localed=* | --locale=*)
861
+    localedir=$ac_optarg ;;
862
+
863
+  -localstatedir | --localstatedir | --localstatedi | --localstated \
864
+  | --localstate | --localstat | --localsta | --localst | --locals)
865
+    ac_prev=localstatedir ;;
866
+  -localstatedir=* | --localstatedir=* | --localstatedi=* | --localstated=* \
867
+  | --localstate=* | --localstat=* | --localsta=* | --localst=* | --locals=*)
868
+    localstatedir=$ac_optarg ;;
869
+
870
+  -mandir | --mandir | --mandi | --mand | --man | --ma | --m)
871
+    ac_prev=mandir ;;
872
+  -mandir=* | --mandir=* | --mandi=* | --mand=* | --man=* | --ma=* | --m=*)
873
+    mandir=$ac_optarg ;;
874
+
875
+  -nfp | --nfp | --nf)
876
+    # Obsolete; use --without-fp.
877
+    with_fp=no ;;
878
+
879
+  -no-create | --no-create | --no-creat | --no-crea | --no-cre \
880
+  | --no-cr | --no-c | -n)
881
+    no_create=yes ;;
882
+
883
+  -no-recursion | --no-recursion | --no-recursio | --no-recursi \
884
+  | --no-recurs | --no-recur | --no-recu | --no-rec | --no-re | --no-r)
885
+    no_recursion=yes ;;
886
+
887
+  -oldincludedir | --oldincludedir | --oldincludedi | --oldincluded \
888
+  | --oldinclude | --oldinclud | --oldinclu | --oldincl | --oldinc \
889
+  | --oldin | --oldi | --old | --ol | --o)
890
+    ac_prev=oldincludedir ;;
891
+  -oldincludedir=* | --oldincludedir=* | --oldincludedi=* | --oldincluded=* \
892
+  | --oldinclude=* | --oldinclud=* | --oldinclu=* | --oldincl=* | --oldinc=* \
893
+  | --oldin=* | --oldi=* | --old=* | --ol=* | --o=*)
894
+    oldincludedir=$ac_optarg ;;
895
+
896
+  -prefix | --prefix | --prefi | --pref | --pre | --pr | --p)
897
+    ac_prev=prefix ;;
898
+  -prefix=* | --prefix=* | --prefi=* | --pref=* | --pre=* | --pr=* | --p=*)
899
+    prefix=$ac_optarg ;;
900
+
901
+  -program-prefix | --program-prefix | --program-prefi | --program-pref \
902
+  | --program-pre | --program-pr | --program-p)
903
+    ac_prev=program_prefix ;;
904
+  -program-prefix=* | --program-prefix=* | --program-prefi=* \
905
+  | --program-pref=* | --program-pre=* | --program-pr=* | --program-p=*)
906
+    program_prefix=$ac_optarg ;;
907
+
908
+  -program-suffix | --program-suffix | --program-suffi | --program-suff \
909
+  | --program-suf | --program-su | --program-s)
910
+    ac_prev=program_suffix ;;
911
+  -program-suffix=* | --program-suffix=* | --program-suffi=* \
912
+  | --program-suff=* | --program-suf=* | --program-su=* | --program-s=*)
913
+    program_suffix=$ac_optarg ;;
914
+
915
+  -program-transform-name | --program-transform-name \
916
+  | --program-transform-nam | --program-transform-na \
917
+  | --program-transform-n | --program-transform- \
918
+  | --program-transform | --program-transfor \
919
+  | --program-transfo | --program-transf \
920
+  | --program-trans | --program-tran \
921
+  | --progr-tra | --program-tr | --program-t)
922
+    ac_prev=program_transform_name ;;
923
+  -program-transform-name=* | --program-transform-name=* \
924
+  | --program-transform-nam=* | --program-transform-na=* \
925
+  | --program-transform-n=* | --program-transform-=* \
926
+  | --program-transform=* | --program-transfor=* \
927
+  | --program-transfo=* | --program-transf=* \
928
+  | --program-trans=* | --program-tran=* \
929
+  | --progr-tra=* | --program-tr=* | --program-t=*)
930
+    program_transform_name=$ac_optarg ;;
931
+
932
+  -pdfdir | --pdfdir | --pdfdi | --pdfd | --pdf | --pd)
933
+    ac_prev=pdfdir ;;
934
+  -pdfdir=* | --pdfdir=* | --pdfdi=* | --pdfd=* | --pdf=* | --pd=*)
935
+    pdfdir=$ac_optarg ;;
936
+
937
+  -psdir | --psdir | --psdi | --psd | --ps)
938
+    ac_prev=psdir ;;
939
+  -psdir=* | --psdir=* | --psdi=* | --psd=* | --ps=*)
940
+    psdir=$ac_optarg ;;
941
+
942
+  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
943
+  | -silent | --silent | --silen | --sile | --sil)
944
+    silent=yes ;;
945
+
946
+  -runstatedir | --runstatedir | --runstatedi | --runstated \
947
+  | --runstate | --runstat | --runsta | --runst | --runs \
948
+  | --run | --ru | --r)
949
+    ac_prev=runstatedir ;;
950
+  -runstatedir=* | --runstatedir=* | --runstatedi=* | --runstated=* \
951
+  | --runstate=* | --runstat=* | --runsta=* | --runst=* | --runs=* \
952
+  | --run=* | --ru=* | --r=*)
953
+    runstatedir=$ac_optarg ;;
954
+
955
+  -sbindir | --sbindir | --sbindi | --sbind | --sbin | --sbi | --sb)
956
+    ac_prev=sbindir ;;
957
+  -sbindir=* | --sbindir=* | --sbindi=* | --sbind=* | --sbin=* \
958
+  | --sbi=* | --sb=*)
959
+    sbindir=$ac_optarg ;;
960
+
961
+  -sharedstatedir | --sharedstatedir | --sharedstatedi \
962
+  | --sharedstated | --sharedstate | --sharedstat | --sharedsta \
963
+  | --sharedst | --shareds | --shared | --share | --shar \
964
+  | --sha | --sh)
965
+    ac_prev=sharedstatedir ;;
966
+  -sharedstatedir=* | --sharedstatedir=* | --sharedstatedi=* \
967
+  | --sharedstated=* | --sharedstate=* | --sharedstat=* | --sharedsta=* \
968
+  | --sharedst=* | --shareds=* | --shared=* | --share=* | --shar=* \
969
+  | --sha=* | --sh=*)
970
+    sharedstatedir=$ac_optarg ;;
971
+
972
+  -site | --site | --sit)
973
+    ac_prev=site ;;
974
+  -site=* | --site=* | --sit=*)
975
+    site=$ac_optarg ;;
976
+
977
+  -srcdir | --srcdir | --srcdi | --srcd | --src | --sr)
978
+    ac_prev=srcdir ;;
979
+  -srcdir=* | --srcdir=* | --srcdi=* | --srcd=* | --src=* | --sr=*)
980
+    srcdir=$ac_optarg ;;
981
+
982
+  -sysconfdir | --sysconfdir | --sysconfdi | --sysconfd | --sysconf \
983
+  | --syscon | --sysco | --sysc | --sys | --sy)
984
+    ac_prev=sysconfdir ;;
985
+  -sysconfdir=* | --sysconfdir=* | --sysconfdi=* | --sysconfd=* | --sysconf=* \
986
+  | --syscon=* | --sysco=* | --sysc=* | --sys=* | --sy=*)
987
+    sysconfdir=$ac_optarg ;;
988
+
989
+  -target | --target | --targe | --targ | --tar | --ta | --t)
990
+    ac_prev=target_alias ;;
991
+  -target=* | --target=* | --targe=* | --targ=* | --tar=* | --ta=* | --t=*)
992
+    target_alias=$ac_optarg ;;
993
+
994
+  -v | -verbose | --verbose | --verbos | --verbo | --verb)
995
+    verbose=yes ;;
996
+
997
+  -version | --version | --versio | --versi | --vers | -V)
998
+    ac_init_version=: ;;
999
+
1000
+  -with-* | --with-*)
1001
+    ac_useropt=`expr "x$ac_option" : 'x-*with-\([^=]*\)'`
1002
+    # Reject names that are not valid shell variable names.
1003
+    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
1004
+      as_fn_error $? "invalid package name: $ac_useropt"
1005
+    ac_useropt_orig=$ac_useropt
1006
+    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
1007
+    case $ac_user_opts in
1008
+      *"
1009
+"with_$ac_useropt"
1010
+"*) ;;
1011
+      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--with-$ac_useropt_orig"
1012
+	 ac_unrecognized_sep=', ';;
1013
+    esac
1014
+    eval with_$ac_useropt=\$ac_optarg ;;
1015
+
1016
+  -without-* | --without-*)
1017
+    ac_useropt=`expr "x$ac_option" : 'x-*without-\(.*\)'`
1018
+    # Reject names that are not valid shell variable names.
1019
+    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
1020
+      as_fn_error $? "invalid package name: $ac_useropt"
1021
+    ac_useropt_orig=$ac_useropt
1022
+    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
1023
+    case $ac_user_opts in
1024
+      *"
1025
+"with_$ac_useropt"
1026
+"*) ;;
1027
+      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--without-$ac_useropt_orig"
1028
+	 ac_unrecognized_sep=', ';;
1029
+    esac
1030
+    eval with_$ac_useropt=no ;;
1031
+
1032
+  --x)
1033
+    # Obsolete; use --with-x.
1034
+    with_x=yes ;;
1035
+
1036
+  -x-includes | --x-includes | --x-include | --x-includ | --x-inclu \
1037
+  | --x-incl | --x-inc | --x-in | --x-i)
1038
+    ac_prev=x_includes ;;
1039
+  -x-includes=* | --x-includes=* | --x-include=* | --x-includ=* | --x-inclu=* \
1040
+  | --x-incl=* | --x-inc=* | --x-in=* | --x-i=*)
1041
+    x_includes=$ac_optarg ;;
1042
+
1043
+  -x-libraries | --x-libraries | --x-librarie | --x-librari \
1044
+  | --x-librar | --x-libra | --x-libr | --x-lib | --x-li | --x-l)
1045
+    ac_prev=x_libraries ;;
1046
+  -x-libraries=* | --x-libraries=* | --x-librarie=* | --x-librari=* \
1047
+  | --x-librar=* | --x-libra=* | --x-libr=* | --x-lib=* | --x-li=* | --x-l=*)
1048
+    x_libraries=$ac_optarg ;;
1049
+
1050
+  -*) as_fn_error $? "unrecognized option: \`$ac_option'
1051
+Try \`$0 --help' for more information"
1052
+    ;;
1053
+
1054
+  *=*)
1055
+    ac_envvar=`expr "x$ac_option" : 'x\([^=]*\)='`
1056
+    # Reject names that are not valid shell variable names.
1057
+    case $ac_envvar in #(
1058
+      '' | [0-9]* | *[!_$as_cr_alnum]* )
1059
+      as_fn_error $? "invalid variable name: \`$ac_envvar'" ;;
1060
+    esac
1061
+    eval $ac_envvar=\$ac_optarg
1062
+    export $ac_envvar ;;
1063
+
1064
+  *)
1065
+    # FIXME: should be removed in autoconf 3.0.
1066
+    $as_echo "$as_me: WARNING: you should use --build, --host, --target" >&2
1067
+    expr "x$ac_option" : ".*[^-._$as_cr_alnum]" >/dev/null &&
1068
+      $as_echo "$as_me: WARNING: invalid host type: $ac_option" >&2
1069
+    : "${build_alias=$ac_option} ${host_alias=$ac_option} ${target_alias=$ac_option}"
1070
+    ;;
1071
+
1072
+  esac
1073
+done
1074
+
1075
+if test -n "$ac_prev"; then
1076
+  ac_option=--`echo $ac_prev | sed 's/_/-/g'`
1077
+  as_fn_error $? "missing argument to $ac_option"
1078
+fi
1079
+
1080
+if test -n "$ac_unrecognized_opts"; then
1081
+  case $enable_option_checking in
1082
+    no) ;;
1083
+    fatal) as_fn_error $? "unrecognized options: $ac_unrecognized_opts" ;;
1084
+    *)     $as_echo "$as_me: WARNING: unrecognized options: $ac_unrecognized_opts" >&2 ;;
1085
+  esac
1086
+fi
1087
+
1088
+# Check all directory arguments for consistency.
1089
+for ac_var in	exec_prefix prefix bindir sbindir libexecdir datarootdir \
1090
+		datadir sysconfdir sharedstatedir localstatedir includedir \
1091
+		oldincludedir docdir infodir htmldir dvidir pdfdir psdir \
1092
+		libdir localedir mandir runstatedir
1093
+do
1094
+  eval ac_val=\$$ac_var
1095
+  # Remove trailing slashes.
1096
+  case $ac_val in
1097
+    */ )
1098
+      ac_val=`expr "X$ac_val" : 'X\(.*[^/]\)' \| "X$ac_val" : 'X\(.*\)'`
1099
+      eval $ac_var=\$ac_val;;
1100
+  esac
1101
+  # Be sure to have absolute directory names.
1102
+  case $ac_val in
1103
+    [\\/$]* | ?:[\\/]* )  continue;;
1104
+    NONE | '' ) case $ac_var in *prefix ) continue;; esac;;
1105
+  esac
1106
+  as_fn_error $? "expected an absolute directory name for --$ac_var: $ac_val"
1107
+done
1108
+
1109
+# There might be people who depend on the old broken behavior: `$host'
1110
+# used to hold the argument of --host etc.
1111
+# FIXME: To remove some day.
1112
+build=$build_alias
1113
+host=$host_alias
1114
+target=$target_alias
1115
+
1116
+# FIXME: To remove some day.
1117
+if test "x$host_alias" != x; then
1118
+  if test "x$build_alias" = x; then
1119
+    cross_compiling=maybe
1120
+  elif test "x$build_alias" != "x$host_alias"; then
1121
+    cross_compiling=yes
1122
+  fi
1123
+fi
1124
+
1125
+ac_tool_prefix=
1126
+test -n "$host_alias" && ac_tool_prefix=$host_alias-
1127
+
1128
+test "$silent" = yes && exec 6>/dev/null
1129
+
1130
+
1131
+ac_pwd=`pwd` && test -n "$ac_pwd" &&
1132
+ac_ls_di=`ls -di .` &&
1133
+ac_pwd_ls_di=`cd "$ac_pwd" && ls -di .` ||
1134
+  as_fn_error $? "working directory cannot be determined"
1135
+test "X$ac_ls_di" = "X$ac_pwd_ls_di" ||
1136
+  as_fn_error $? "pwd does not report name of working directory"
1137
+
1138
+
1139
+# Find the source files, if location was not specified.
1140
+if test -z "$srcdir"; then
1141
+  ac_srcdir_defaulted=yes
1142
+  # Try the directory containing this script, then the parent directory.
1143
+  ac_confdir=`$as_dirname -- "$as_myself" ||
1144
+$as_expr X"$as_myself" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
1145
+	 X"$as_myself" : 'X\(//\)[^/]' \| \
1146
+	 X"$as_myself" : 'X\(//\)$' \| \
1147
+	 X"$as_myself" : 'X\(/\)' \| . 2>/dev/null ||
1148
+$as_echo X"$as_myself" |
1149
+    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
1150
+	    s//\1/
1151
+	    q
1152
+	  }
1153
+	  /^X\(\/\/\)[^/].*/{
1154
+	    s//\1/
1155
+	    q
1156
+	  }
1157
+	  /^X\(\/\/\)$/{
1158
+	    s//\1/
1159
+	    q
1160
+	  }
1161
+	  /^X\(\/\).*/{
1162
+	    s//\1/
1163
+	    q
1164
+	  }
1165
+	  s/.*/./; q'`
1166
+  srcdir=$ac_confdir
1167
+  if test ! -r "$srcdir/$ac_unique_file"; then
1168
+    srcdir=..
1169
+  fi
1170
+else
1171
+  ac_srcdir_defaulted=no
1172
+fi
1173
+if test ! -r "$srcdir/$ac_unique_file"; then
1174
+  test "$ac_srcdir_defaulted" = yes && srcdir="$ac_confdir or .."
1175
+  as_fn_error $? "cannot find sources ($ac_unique_file) in $srcdir"
1176
+fi
1177
+ac_msg="sources are in $srcdir, but \`cd $srcdir' does not work"
1178
+ac_abs_confdir=`(
1179
+	cd "$srcdir" && test -r "./$ac_unique_file" || as_fn_error $? "$ac_msg"
1180
+	pwd)`
1181
+# When building in place, set srcdir=.
1182
+if test "$ac_abs_confdir" = "$ac_pwd"; then
1183
+  srcdir=.
1184
+fi
1185
+# Remove unnecessary trailing slashes from srcdir.
1186
+# Double slashes in file names in object file debugging info
1187
+# mess up M-x gdb in Emacs.
1188
+case $srcdir in
1189
+*/) srcdir=`expr "X$srcdir" : 'X\(.*[^/]\)' \| "X$srcdir" : 'X\(.*\)'`;;
1190
+esac
1191
+for ac_var in $ac_precious_vars; do
1192
+  eval ac_env_${ac_var}_set=\${${ac_var}+set}
1193
+  eval ac_env_${ac_var}_value=\$${ac_var}
1194
+  eval ac_cv_env_${ac_var}_set=\${${ac_var}+set}
1195
+  eval ac_cv_env_${ac_var}_value=\$${ac_var}
1196
+done
1197
+
1198
+#
1199
+# Report the --help message.
1200
+#
1201
+if test "$ac_init_help" = "long"; then
1202
+  # Omit some internal or obsolete options to make the list less imposing.
1203
+  # This message is too long to be a string in the A/UX 3.1 sh.
1204
+  cat <<_ACEOF
1205
+\`configure' configures CoGAPS 3.1.2 to adapt to many kinds of systems.
1206
+
1207
+Usage: $0 [OPTION]... [VAR=VALUE]...
1208
+
1209
+To assign environment variables (e.g., CC, CFLAGS...), specify them as
1210
+VAR=VALUE.  See below for descriptions of some of the useful variables.
1211
+
1212
+Defaults for the options are specified in brackets.
1213
+
1214
+Configuration:
1215
+  -h, --help              display this help and exit
1216
+      --help=short        display options specific to this package
1217
+      --help=recursive    display the short help of all the included packages
1218
+  -V, --version           display version information and exit
1219
+  -q, --quiet, --silent   do not print \`checking ...' messages
1220
+      --cache-file=FILE   cache test results in FILE [disabled]
1221
+  -C, --config-cache      alias for \`--cache-file=config.cache'
1222
+  -n, --no-create         do not create output files
1223
+      --srcdir=DIR        find the sources in DIR [configure dir or \`..']
1224
+
1225
+Installation directories:
1226
+  --prefix=PREFIX         install architecture-independent files in PREFIX
1227
+                          [$ac_default_prefix]
1228
+  --exec-prefix=EPREFIX   install architecture-dependent files in EPREFIX
1229
+                          [PREFIX]
1230
+
1231
+By default, \`make install' will install all the files in
1232
+\`$ac_default_prefix/bin', \`$ac_default_prefix/lib' etc.  You can specify
1233
+an installation prefix other than \`$ac_default_prefix' using \`--prefix',
1234
+for instance \`--prefix=\$HOME'.
1235
+
1236
+For better control, use the options below.
1237
+
1238
+Fine tuning of the installation directories:
1239
+  --bindir=DIR            user executables [EPREFIX/bin]
1240
+  --sbindir=DIR           system admin executables [EPREFIX/sbin]
1241
+  --libexecdir=DIR        program executables [EPREFIX/libexec]
1242
+  --sysconfdir=DIR        read-only single-machine data [PREFIX/etc]
1243
+  --sharedstatedir=DIR    modifiable architecture-independent data [PREFIX/com]
1244
+  --localstatedir=DIR     modifiable single-machine data [PREFIX/var]
1245
+  --runstatedir=DIR       modifiable per-process data [LOCALSTATEDIR/run]
1246
+  --libdir=DIR            object code libraries [EPREFIX/lib]
1247
+  --includedir=DIR        C header files [PREFIX/include]
1248
+  --oldincludedir=DIR     C header files for non-gcc [/usr/include]
1249
+  --datarootdir=DIR       read-only arch.-independent data root [PREFIX/share]
1250
+  --datadir=DIR           read-only architecture-independent data [DATAROOTDIR]
1251
+  --infodir=DIR           info documentation [DATAROOTDIR/info]
1252
+  --localedir=DIR         locale-dependent data [DATAROOTDIR/locale]
1253
+  --mandir=DIR            man documentation [DATAROOTDIR/man]
1254
+  --docdir=DIR            documentation root [DATAROOTDIR/doc/cogaps]
1255
+  --htmldir=DIR           html documentation [DOCDIR]
1256
+  --dvidir=DIR            dvi documentation [DOCDIR]
1257
+  --pdfdir=DIR            pdf documentation [DOCDIR]
1258
+  --psdir=DIR             ps documentation [DOCDIR]
1259
+_ACEOF
1260
+
1261
+  cat <<\_ACEOF
1262
+_ACEOF
1263
+fi
1264
+
1265
+if test -n "$ac_init_help"; then
1266
+  case $ac_init_help in
1267
+     short | recursive ) echo "Configuration of CoGAPS 3.1.2:";;
1268
+   esac
1269
+  cat <<\_ACEOF
1270
+
1271
+Optional Features:
1272
+  --disable-option-checking  ignore unrecognized --enable/--with options
1273
+  --disable-FEATURE       do not include FEATURE (same as --enable-FEATURE=no)
1274
+  --enable-FEATURE[=ARG]  include FEATURE [ARG=yes]
1275
+  --enable-debug          build debug version of CoGAPS
1276
+  --enable-warnings       compile CoGAPS with warning messages
1277
+  --enable-simd           specify simd instruction set (sse, avx)
1278
+
1279
+Some influential environment variables:
1280
+  CXX         C++ compiler command
1281
+  CXXFLAGS    C++ compiler flags
1282
+  LDFLAGS     linker flags, e.g. -L<lib dir> if you have libraries in a
1283
+              nonstandard directory <lib dir>
1284
+  LIBS        libraries to pass to the linker, e.g. -l<library>
1285
+  CPPFLAGS    (Objective) C/C++ preprocessor flags, e.g. -I<include dir> if
1286
+              you have headers in a nonstandard directory <include dir>
1287
+  CXXCPP      C++ preprocessor
1288
+
1289
+Use these variables to override the choices made by `configure' or to help
1290
+it to find libraries and programs with nonstandard names/locations.
1291
+
1292
+Report bugs to the package provider.
1293
+_ACEOF
1294
+ac_status=$?
1295
+fi
1296
+
1297
+if test "$ac_init_