* installing *source* package ‘groupsubsetselection’ ...
** package ‘groupsubsetselection’ successfully unpacked and MD5 sums checked
** using staged installation
** libs
using C compiler: ‘Apple clang version 14.0.3 (clang-1403.0.22.14.1)’
using Fortran compiler: ‘GNU Fortran (GCC) 12.2.0’
using SDK: ‘MacOSX11.3.sdk’
gfortran -arch x86_64  -fPIC  -Wall -g -O2  -c  gss.f90 -o gss.o
gss.f90:104:2:

  104 |                                 wtslb(:) ! Weights lower bounds for each weight.
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:1491:18:

 1491 |   ulist(first)=j                                                                                !   AAG
      |                         1~~~~~~~
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:1492:26:

 1492 |   call legal(ulist,ok,1)                                                                !   AAG
      |                                 1~~~~~~~
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:2907:2:

 2907 |         call gaddwtsconstraint(beta, g_ptr(first)-1, &
      |         1
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:2908:2:

 2908 |         corder(1:g_ptr(first)-1), wtslb(1:g_ptr(first)-1),&
      |         1
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:2909:2:

 2909 |         r, row_ptr, wx, fposwts)
      |         1
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:1881:3:

 1881 | 910 FORMAT(' Best variable to drop: ', i4, '  F-to-drop  = ', f10.2)
      |   1
Warning: Label 910 at (1) defined but not used [-Wunused-label]
gss.f90:1858:3:

 1858 | 900 FORMAT(' Best variable to add:  ', i4, '  F-to-enter = ', f10.2)
      |   1
Warning: Label 900 at (1) defined but not used [-Wunused-label]
gss.f90:1634:49:

 1634 |             subvars(1:2+g_ptr(first)-1,maxidx) = wtsvars
      |                                                 1
Warning: Possible change of value in conversion from REAL(8) to INTEGER(4) at (1) [-Wconversion]
gss.f90:2933:59:

 2933 |                     subvars(1:cnv+g_ptr(first)-1,maxidx) = varswts
      |                                                           1
Warning: Possible change of value in conversion from REAL(8) to INTEGER(4) at (1) [-Wconversion]
gss.f90:2556:6:

 2556 |   k = first2 + r*navail
      |      1
Warning: Possible change of value in conversion from REAL(4) to INTEGER(4) at (1) [-Wconversion]
gss.f90:3304:2:

 3304 |                      noutwts, comptime)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3317:2:

 3317 |                         consval(nvartotal+nfixed)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3347:13:

 3347 | cvd=.FALSE.                                                     ! Cross validation
      |                 1~~~~~~~
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3348:21:

 3348 | Recompute_QR=.TRUE.                                     ! Switch to use existing QR file. FALSE uses existing file. TRUE creates it.
      |                         1~~~~~~~
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3444:2:

 3444 |         i0 = i0 + i - 1
      |         1
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3445:2:

 3445 |         do j = 1, nbest
      |         1
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3446:2:

 3446 |                 outgroups(pos:pos+i-1) = lopt(i0:i0+i-1,j)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3447:2:

 3447 |                 pos = pos + i
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3448:2:

 3448 |         end do
      |         1
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3453:2:

 3453 |         do i =1, nbest
      |         1
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3454:2:

 3454 |                 iflag = -1
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3455:2:

 3455 |                 do j = 1, nbest
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3456:2:

 3456 |                         if (rank_ind(k,j) == i) then
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3457:2:

 3457 |                                 iflag = j
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3458:2:

 3458 |                                 exit
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3459:2:

 3459 |                         end if
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3460:2:

 3460 |                 end do
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3461:2:

 3461 |                 if (iflag /= -1)  then! Then iflag is the index of the i-th best
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3462:2:

 3462 |                         tmpnvars = nvwts(k,iflag) + nforce
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3464:2:

 3464 |                         IF (ALLOCATED(tmpvars)) DEALLOCATE(tmpvars)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3465:2:

 3465 |                         ALLOCATE ( tmpvars(tmpnvars) )
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3466:2:

 3466 |                         IF (ALLOCATED(tmpwts)) DEALLOCATE(tmpwts)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3467:2:

 3467 |                         ALLOCATE ( tmpwts(tmpnvars) )
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3469:2:

 3469 |                         tmpvars = vwts(wts_ptr(k):wts_ptr(k)+tmpnvars-1,iflag)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3470:2:

 3470 |                         tmpwts = wts(wts_ptr(k):wts_ptr(k)+tmpnvars-1,iflag)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3472:2:

 3472 |                         call Acc_Shell_Sort(tmpvars,tmpwts)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3473:2:

 3473 |                         outwts((i-1)*pos+wts_ptr(k):(i-1)*pos+wts_ptr(k)+tmpnvars-1) = tmpwts
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3474:2:

 3474 |                 end if
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3475:2:

 3475 |         end do
      |         1
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3598:2:

 3598 |                  tempb = b(i)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3601:2:

 3601 |                         b(j) = b(j-increment)
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3605:2:

 3605 |                  b(j) = tempb
      |         1       
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3608:5:

 3608 |           increment = 1
      |         1
Warning: Nonconforming tab character at (1) [-Wtabs]
gss.f90:3217:47:

 3217 | INTEGER    :: rank, pos1, j, list(nv), ok, ipos, idx, m, temp(nbest)
      |                                               1
Warning: Unused variable ‘ipos’ declared at (1) [-Wunused-variable]
gss.f90:3217:41:

 3217 | INTEGER    :: rank, pos1, j, list(nv), ok, ipos, idx, m, temp(nbest)
      |                                         1
Warning: Unused variable ‘ok’ declared at (1) [-Wunused-variable]
gss.f90:3108:26:

 3108 | INTEGER    :: row, i, jmax, ipt, newpos, iwk(max_size)
      |                          1
Warning: Unused variable ‘jmax’ declared at (1) [-Wunused-variable]
gss.f90:3109:28:

 3109 | REAL (dp)  :: ss(last), smax, temp
      |                            1
Warning: Unused variable ‘smax’ declared at (1) [-Wunused-variable]
gss.f90:3109:22:

 3109 | REAL (dp)  :: ss(last), smax, temp
      |                      1
Warning: Unused variable ‘ss’ declared at (1) [-Wunused-variable]
gss.f90:3012:22:

 3012 | REAL (dp)  :: ss(last), smax, temp
      |                      1
Warning: Unused variable ‘ss’ declared at (1) [-Wunused-variable]
gss.f90:2803:35:

 2803 | INTEGER    :: j, inc, pos, row, col,i, cnv, nr, m, idx_first, idx_last, ltemp, fposwts, maxval, maxidx, wtsdim, idx(nbest) !weights
      |                                   1
Warning: Unused variable ‘col’ declared at (1) [-Wunused-variable]
gss.f90:2804:33:

 2804 | REAL (dp)  :: zero = 0.0_dp, diag, dy, ssqx, sxx(ncol), sxy(ncol), wsserr, wy, ss(nbest)
      |                                 1
Warning: Unused variable ‘diag’ declared at (1) [-Wunused-variable]
gss.f90:2804:37:

 2804 | REAL (dp)  :: zero = 0.0_dp, diag, dy, ssqx, sxx(ncol), sxy(ncol), wsserr, wy, ss(nbest)
      |                                     1
Warning: Unused variable ‘dy’ declared at (1) [-Wunused-variable]
gss.f90:2803:30:

 2803 | INTEGER    :: j, inc, pos, row, col,i, cnv, nr, m, idx_first, idx_last, ltemp, fposwts, maxval, maxidx, wtsdim, idx(nbest) !weights
      |                              1
Warning: Unused variable ‘row’ declared at (1) [-Wunused-variable]
gss.f90:2804:43:

 2804 | REAL (dp)  :: zero = 0.0_dp, diag, dy, ssqx, sxx(ncol), sxy(ncol), wsserr, wy, ss(nbest)
      |                                           1
Warning: Unused variable ‘ssqx’ declared at (1) [-Wunused-variable]
gss.f90:2804:54:

 2804 | REAL (dp)  :: zero = 0.0_dp, diag, dy, ssqx, sxx(ncol), sxy(ncol), wsserr, wy, ss(nbest)
      |                                                      1
Warning: Unused variable ‘sxx’ declared at (1) [-Wunused-variable]
gss.f90:2804:65:

 2804 | REAL (dp)  :: zero = 0.0_dp, diag, dy, ssqx, sxx(ncol), sxy(ncol), wsserr, wy, ss(nbest)
      |                                                                 1
Warning: Unused variable ‘sxy’ declared at (1) [-Wunused-variable]
gss.f90:2805:71:

 2805 | real (dp), allocatable :: wr(:), wd(:),wrhs(:), wx(:), beta(:),ubeta(:), varswts(:) !weights
      |                                                                       1
Warning: Unused variable ‘ubeta’ declared at (1) [-Wunused-variable]
gss.f90:2804:18:

 2804 | REAL (dp)  :: zero = 0.0_dp, diag, dy, ssqx, sxx(ncol), sxy(ncol), wsserr, wy, ss(nbest)
      |                  1
Warning: Unused variable ‘zero’ declared at (1) [-Wunused-variable]
gss.f90:2755:26:

 2755 | INTEGER    :: row, i, jmax, ipt, newpos,first, iwk(p)
      |                          1
Warning: Unused variable ‘jmax’ declared at (1) [-Wunused-variable]
gss.f90:2755:39:

 2755 | INTEGER    :: row, i, jmax, ipt, newpos,first, iwk(p)
      |                                       1
Warning: Unused variable ‘newpos’ declared at (1) [-Wunused-variable]
gss.f90:2755:17:

 2755 | INTEGER    :: row, i, jmax, ipt, newpos,first, iwk(p)
      |                 1
Warning: Unused variable ‘row’ declared at (1) [-Wunused-variable]
gss.f90:2656:26:

 2656 | INTEGER    :: row, i, jmax, ipt, newpos, iwk(max_size)
      |                          1
Warning: Unused variable ‘jmax’ declared at (1) [-Wunused-variable]
gss.f90:2657:28:

 2657 | REAL (dp)  :: ss(last), smax, temp
      |                            1
Warning: Unused variable ‘smax’ declared at (1) [-Wunused-variable]
gss.f90:2657:22:

 2657 | REAL (dp)  :: ss(last), smax, temp
      |                      1
Warning: Unused variable ‘ss’ declared at (1) [-Wunused-variable]
gss.f90:2571:30:

 2571 | SUBROUTINE legal(vlist,ok,flag)
      |                              1
Warning: Unused dummy argument ‘flag’ at (1) [-Wunused-dummy-argument]
gss.f90:2118:41:

 2118 | INTEGER    :: rank, pos1, j, list(nv), ok
      |                                         1
Warning: Unused variable ‘ok’ declared at (1) [-Wunused-variable]
gss.f90:2026:41:

 2026 | INTEGER    :: rank, pos1, j, list(nv), ok, ipos, idx, m, temp(nbest)
      |                                         1
Warning: Unused variable ‘ok’ declared at (1) [-Wunused-variable]
gss.f90:1797:57:

 1797 | SUBROUTINE efroym(first, last, fin, fout, size, ier, lout)
      |                                                         1
Warning: Unused dummy argument ‘lout’ at (1) [-Wunused-dummy-argument]
gss.f90:1543:35:

 1543 | integer, allocatable :: wrow_ptr(:), subvars(:,:), subnvars(:), subrank(:), subloc(:) !Locators of weights and variables, weights code !weights
      |                                   1
Warning: Unused variable ‘wrow_ptr’ declared at (1) [-Wunused-variable]
gss.f90:3536:44:

 3536 | INTEGER                 :: ipos, i, iostatus, ier
      |                                            1
Warning: Unused variable ‘iostatus’ declared at (1) [-Wunused-variable]
gss.f90:3536:31:

 3536 | INTEGER                 :: ipos, i, iostatus, ier
      |                               1
Warning: Unused variable ‘ipos’ declared at (1) [-Wunused-variable]
gss.f90:3535:31:

 3535 | CHARACTER (LEN = 79)    :: text
      |                               1
Warning: Unused variable ‘text’ declared at (1) [-Wunused-variable]
gss.f90:3538:43:

 3538 | REAL, ALLOCATABLE       :: xmin(:), xmax(:), xmean(:), xstdev(:)
      |                                           1
Warning: Unused variable ‘xmax’ declared at (1) [-Wunused-variable]
gss.f90:3538:53:

 3538 | REAL, ALLOCATABLE       :: xmin(:), xmax(:), xmean(:), xstdev(:)
      |                                                     1
Warning: Unused variable ‘xmean’ declared at (1) [-Wunused-variable]
gss.f90:3538:34:

 3538 | REAL, ALLOCATABLE       :: xmin(:), xmax(:), xmean(:), xstdev(:)
      |                                  1
Warning: Unused variable ‘xmin’ declared at (1) [-Wunused-variable]
gss.f90:3538:64:

 3538 | REAL, ALLOCATABLE       :: xmin(:), xmax(:), xmean(:), xstdev(:)
      |                                                                1
Warning: Unused variable ‘xstdev’ declared at (1) [-Wunused-variable]
gss.f90:3539:37:

 3539 | REAL                    :: ymin, ymax, ymean, ystdev
      |                                     1
Warning: Unused variable ‘ymax’ declared at (1) [-Wunused-variable]
gss.f90:3539:44:

 3539 | REAL                    :: ymin, ymax, ymean, ystdev
      |                                            1
Warning: Unused variable ‘ymean’ declared at (1) [-Wunused-variable]
gss.f90:3539:31:

 3539 | REAL                    :: ymin, ymax, ymean, ystdev
      |                               1
Warning: Unused variable ‘ymin’ declared at (1) [-Wunused-variable]
gss.f90:3539:52:

 3539 | REAL                    :: ymin, ymax, ymean, ystdev
      |                                                    1
Warning: Unused variable ‘ystdev’ declared at (1) [-Wunused-variable]
gss.f90:3498:26:

 3498 | INTEGER               :: i
      |                          1
Warning: Unused variable ‘i’ declared at (1) [-Wunused-variable]
gss.f90:3495:33:

 3495 | CHARACTER (LEN=20)    :: response
      |                                 1
Warning: Unused variable ‘response’ declared at (1) [-Wunused-variable]
gss.f90:3325:27:

 3325 | CHARACTER (LEN = 1)  :: ans, bel = CHAR(7), yesno
      |                           1
Warning: Unused variable ‘ans’ declared at (1) [-Wunused-variable]
gss.f90:3325:32:

 3325 | CHARACTER (LEN = 1)  :: ans, bel = CHAR(7), yesno
      |                                1
Warning: Unused variable ‘bel’ declared at (1) [-Wunused-variable]
gss.f90:3328:57:

 3328 |                         ypos, in, dimc, nv, i0, best_size, line1, nrepl,    &
      |                                                         1
Warning: Unused variable ‘best_size’ declared at (1) [-Wunused-variable]
gss.f90:3336:55:

 3336 | REAL (dp), ALLOCATABLE  :: cormat(:), ycorr(:), beta(:), x(:), xcopy(:)
      |                                                       1
Warning: Unused variable ‘beta’ declared at (1) [-Wunused-variable]
gss.f90:3336:36:

 3336 | REAL (dp), ALLOCATABLE  :: cormat(:), ycorr(:), beta(:), x(:), xcopy(:)
      |                                    1
Warning: Unused variable ‘cormat’ declared at (1) [-Wunused-variable]
gss.f90:3339:31:

 3339 | REAL                 :: var, Cp, Cp_last, fmax, f1, f5, f10, zero = 0.0
      |                               1
Warning: Unused variable ‘cp’ declared at (1) [-Wunused-variable]
gss.f90:3339:40:

 3339 | REAL                 :: var, Cp, Cp_last, fmax, f1, f5, f10, zero = 0.0
      |                                        1
Warning: Unused variable ‘cp_last’ declared at (1) [-Wunused-variable]
gss.f90:3329:48:

 3329 |                         search_method, criterion, iostatus, rank_deficit, ndf, &
      |                                                1
Warning: Unused variable ‘criterion’ declared at (1) [-Wunused-variable]
gss.f90:3328:38:

 3328 |                         ypos, in, dimc, nv, i0, best_size, line1, nrepl,    &
      |                                      1
Warning: Unused variable ‘dimc’ declared at (1) [-Wunused-variable]
gss.f90:3335:28:

 3335 |                         y, e, h, eps
      |                            1
Warning: Unused variable ‘e’ declared at (1) [-Wunused-variable]
gss.f90:3335:36:

 3335 |                         y, e, h, eps
      |                                    1
Warning: Unused variable ‘eps’ declared at (1) [-Wunused-variable]
gss.f90:3339:50:

 3339 | REAL                 :: var, Cp, Cp_last, fmax, f1, f5, f10, zero = 0.0
      |                                                  1
Warning: Unused variable ‘f1’ declared at (1) [-Wunused-variable]
gss.f90:3339:59:

 3339 | REAL                 :: var, Cp, Cp_last, fmax, f1, f5, f10, zero = 0.0
      |                                                           1
Warning: Unused variable ‘f10’ declared at (1) [-Wunused-variable]
gss.f90:3339:54:

 3339 | REAL                 :: var, Cp, Cp_last, fmax, f1, f5, f10, zero = 0.0
      |                                                      1
Warning: Unused variable ‘f5’ declared at (1) [-Wunused-variable]
gss.f90:3330:30:

 3330 |                         iy, fc,npc,nnn,fdisp, nvar, iflag !Yi
      |                              1
Warning: Unused variable ‘fc’ declared at (1) [-Wunused-variable]
gss.f90:3330:44:

 3330 |                         iy, fc,npc,nnn,fdisp, nvar, iflag !Yi
      |                                            1
Warning: Unused variable ‘fdisp’ declared at (1) [-Wunused-variable]
gss.f90:3334:38:

 3334 | REAL (dp)            :: one = 1.0, fin, fout, total_sumsq, r2, msep, press, &
      |                                      1
Warning: Unused variable ‘fin’ declared at (1) [-Wunused-variable]
gss.f90:3339:46:

 3339 | REAL                 :: var, Cp, Cp_last, fmax, f1, f5, f10, zero = 0.0
      |                                              1
Warning: Unused variable ‘fmax’ declared at (1) [-Wunused-variable]
gss.f90:3324:66:

 3324 | CHARACTER (LEN = 40) :: fname_dat, fname_red, fname_rpt, fname_ctl, fname_y,lstring
      |                                                                  1
Warning: Unused variable ‘fname_ctl’ declared at (1) [-Wunused-variable]
gss.f90:3324:33:

 3324 | CHARACTER (LEN = 40) :: fname_dat, fname_red, fname_rpt, fname_ctl, fname_y,lstring
      |                                 1
Warning: Unused variable ‘fname_dat’ declared at (1) [-Wunused-variable]
gss.f90:3324:44:

 3324 | CHARACTER (LEN = 40) :: fname_dat, fname_red, fname_rpt, fname_ctl, fname_y,lstring
      |                                            1
Warning: Unused variable ‘fname_red’ declared at (1) [-Wunused-variable]
gss.f90:3324:55:

 3324 | CHARACTER (LEN = 40) :: fname_dat, fname_red, fname_rpt, fname_ctl, fname_y,lstring
      |                                                       1
Warning: Unused variable ‘fname_rpt’ declared at (1) [-Wunused-variable]
gss.f90:3324:75:

 3324 | CHARACTER (LEN = 40) :: fname_dat, fname_red, fname_rpt, fname_ctl, fname_y,lstring
      |                                                                           1
Warning: Unused variable ‘fname_y’ declared at (1) [-Wunused-variable]
gss.f90:3334:44:

 3334 | REAL (dp)            :: one = 1.0, fin, fout, total_sumsq, r2, msep, press, &
      |                                            1
Warning: Unused variable ‘fout’ declared at (1) [-Wunused-variable]
gss.f90:3335:31:

 3335 |                         y, e, h, eps
      |                               1
Warning: Unused variable ‘h’ declared at (1) [-Wunused-variable]
gss.f90:3328:32:

 3328 |                         ypos, in, dimc, nv, i0, best_size, line1, nrepl,    &
      |                                1
Warning: Unused variable ‘in’ declared at (1) [-Wunused-variable]
gss.f90:3329:58:

 3329 |                         search_method, criterion, iostatus, rank_deficit, ndf, &
      |                                                          1
Warning: Unused variable ‘iostatus’ declared at (1) [-Wunused-variable]
gss.f90:3330:26:

 3330 |                         iy, fc,npc,nnn,fdisp, nvar, iflag !Yi
      |                          1
Warning: Unused variable ‘iy’ declared at (1) [-Wunused-variable]
gss.f90:3328:64:

 3328 |                         ypos, in, dimc, nv, i0, best_size, line1, nrepl,    &
      |                                                                1
Warning: Unused variable ‘line1’ declared at (1) [-Wunused-variable]
gss.f90:3331:31:

 3331 | INTEGER, ALLOCATABLE :: list(:), seed(:), order_copy(:), force(:)
      |                               1
Warning: Unused variable ‘list’ declared at (1) [-Wunused-variable]
gss.f90:3338:28:

 3338 | LOGICAL              :: lsel = .false., OK, cvd,Recompute_QR, firstpass
      |                            1
Warning: Unused variable ‘lsel’ declared at (1) [-Wunused-variable]
gss.f90:3324:83:

 3324 | CHARACTER (LEN = 40) :: fname_dat, fname_red, fname_rpt, fname_ctl, fname_y,lstring
      |                                                                                   1
Warning: Unused variable ‘lstring’ declared at (1) [-Wunused-variable]
gss.f90:3334:67:

 3334 | REAL (dp)            :: one = 1.0, fin, fout, total_sumsq, r2, msep, press, &
      |                                                                   1
Warning: Unused variable ‘msep’ declared at (1) [-Wunused-variable]
gss.f90:3330:38:

 3330 |                         iy, fc,npc,nnn,fdisp, nvar, iflag !Yi
      |                                      1
Warning: Unused variable ‘nnn’ declared at (1) [-Wunused-variable]
gss.f90:3330:34:

 3330 |                         iy, fc,npc,nnn,fdisp, nvar, iflag !Yi
      |                                  1
Warning: Unused variable ‘npc’ declared at (1) [-Wunused-variable]
gss.f90:3328:71:

 3328 |                         ypos, in, dimc, nv, i0, best_size, line1, nrepl,    &
      |                                                                       1
Warning: Unused variable ‘nrepl’ declared at (1) [-Wunused-variable]
gss.f90:3327:50:

 3327 | INTEGER              :: first, last, ier, i, nsize, pos, j,  &
      |                                                  1
Warning: Unused variable ‘nsize’ declared at (1) [-Wunused-variable]
gss.f90:3328:42:

 3328 |                         ypos, in, dimc, nv, i0, best_size, line1, nrepl,    &
      |                                          1
Warning: Unused variable ‘nv’ declared at (1) [-Wunused-variable]
gss.f90:3338:42:

 3338 | LOGICAL              :: lsel = .false., OK, cvd,Recompute_QR, firstpass
      |                                          1
Warning: Unused variable ‘ok’ declared at (1) [-Wunused-variable]
gss.f90:3334:27:

 3334 | REAL (dp)            :: one = 1.0, fin, fout, total_sumsq, r2, msep, press, &
      |                           1
Warning: Unused variable ‘one’ declared at (1) [-Wunused-variable]
gss.f90:3331:55:

 3331 | INTEGER, ALLOCATABLE :: list(:), seed(:), order_copy(:), force(:)
      |                                                       1
Warning: Unused variable ‘order_copy’ declared at (1) [-Wunused-variable]
gss.f90:3334:74:

 3334 | REAL (dp)            :: one = 1.0, fin, fout, total_sumsq, r2, msep, press, &
      |                                                                          1
Warning: Unused variable ‘press’ declared at (1) [-Wunused-variable]
gss.f90:3334:61:

 3334 | REAL (dp)            :: one = 1.0, fin, fout, total_sumsq, r2, msep, press, &
      |                                                             1
Warning: Unused variable ‘r2’ declared at (1) [-Wunused-variable]
gss.f90:3329:37:

 3329 |                         search_method, criterion, iostatus, rank_deficit, ndf, &
      |                                     1
Warning: Unused variable ‘search_method’ declared at (1) [-Wunused-variable]
gss.f90:3331:40:

 3331 | INTEGER, ALLOCATABLE :: list(:), seed(:), order_copy(:), force(:)
      |                                        1
Warning: Unused variable ‘seed’ declared at (1) [-Wunused-variable]
gss.f90:3326:30:

 3326 | CHARACTER (LEN = 10) :: string
      |                              1
Warning: Unused variable ‘string’ declared at (1) [-Wunused-variable]
gss.f90:3339:27:

 3339 | REAL                 :: var, Cp, Cp_last, fmax, f1, f5, f10, zero = 0.0
      |                           1
Warning: Unused variable ‘var’ declared at (1) [-Wunused-variable]
gss.f90:3336:61:

 3336 | REAL (dp), ALLOCATABLE  :: cormat(:), ycorr(:), beta(:), x(:), xcopy(:)
      |                                                             1
Warning: Unused variable ‘x’ declared at (1) [-Wunused-variable]
gss.f90:3336:71:

 3336 | REAL (dp), ALLOCATABLE  :: cormat(:), ycorr(:), beta(:), x(:), xcopy(:)
      |                                                                       1
Warning: Unused variable ‘xcopy’ declared at (1) [-Wunused-variable]
gss.f90:3335:25:

 3335 |                         y, e, h, eps
      |                         1
Warning: Unused variable ‘y’ declared at (1) [-Wunused-variable]
gss.f90:3336:46:

 3336 | REAL (dp), ALLOCATABLE  :: cormat(:), ycorr(:), beta(:), x(:), xcopy(:)
      |                                              1
Warning: Unused variable ‘ycorr’ declared at (1) [-Wunused-variable]
gss.f90:3325:49:

 3325 | CHARACTER (LEN = 1)  :: ans, bel = CHAR(7), yesno
      |                                                 1
Warning: Unused variable ‘yesno’ declared at (1) [-Wunused-variable]
gss.f90:3328:28:

 3328 |                         ypos, in, dimc, nv, i0, best_size, line1, nrepl,    &
      |                            1
Warning: Unused variable ‘ypos’ declared at (1) [-Wunused-variable]
gss.f90:3339:65:

 3339 | REAL                 :: var, Cp, Cp_last, fmax, f1, f5, f10, zero = 0.0
      |                                                                 1
Warning: Unused variable ‘zero’ declared at (1) [-Wunused-variable]
clang -arch x86_64 -I"/Library/Frameworks/R.framework/Resources/include" -DNDEBUG   -I/opt/R/x86_64/include    -fPIC  -falign-functions=64 -Wall -g -O2  -c init.c -o init.o
clang -arch x86_64 -dynamiclib -Wl,-headerpad_max_install_names -undefined dynamic_lookup -single_module -multiply_defined suppress -L/Library/Frameworks/R.framework/Resources/lib -L/opt/R/x86_64/lib -o groupsubsetselection.so gss.o init.o -L/opt/gfortran/lib/gcc/x86_64-apple-darwin20.0/12.2.0 -L/opt/gfortran/lib -lgfortran -lquadmath -F/Library/Frameworks/R.framework/.. -framework R -Wl,-framework -Wl,CoreFoundation
installing to /Volumes/Builds/packages/big-sur-x86_64/results/4.3/groupsubsetselection.Rcheck/00LOCK-groupsubsetselection/00new/groupsubsetselection/libs
** generating debug symbols (dSYM)
** R
** byte-compile and prepare package for lazy loading
** help
*** installing help indices
** building package indices
** testing if installed package can be loaded from temporary location
** checking absolute paths in shared objects and dynamic libraries
** testing if installed package can be loaded from final location
** testing if installed package keeps a record of temporary installation path
* DONE (groupsubsetselection)