Skip to content

Commit

Permalink
makemaster typo corrected
Browse files Browse the repository at this point in the history
  • Loading branch information
nimgould committed Feb 5, 2024
1 parent 9ab75f3 commit 2160f01
Show file tree
Hide file tree
Showing 4 changed files with 17 additions and 18 deletions.
18 changes: 9 additions & 9 deletions src/forthcoming/colt/colt.F90
Original file line number Diff line number Diff line change
Expand Up @@ -32,7 +32,7 @@ MODULE GALAHAD_COLT_precision
! ----------------------------------------------------------

USE GALAHAD_KINDS_precision
!$ USE omp_lib
!$ USE omp_lib
USE GALAHAD_CLOCK
USE GALAHAD_SYMBOLS
USE GALAHAD_STRING
Expand Down Expand Up @@ -1190,7 +1190,7 @@ END SUBROUTINE eval_HOCPRODS

! functions

!$ INTEGER ( KIND = ip_ ) :: OMP_GET_MAX_THREADS
!$ INTEGER :: OMP_GET_MAX_THREADS

CHARACTER ( LEN = LEN( TRIM( control%prefix ) ) - 2 ) :: prefix
IF ( LEN( TRIM( control%prefix ) ) > 2 ) &
Expand Down Expand Up @@ -1226,7 +1226,7 @@ END SUBROUTINE eval_HOCPRODS
10 CONTINUE

CALL CPU_time( data%time_start ) ; CALL CLOCK_time( data%clock_start )
!$ inform%threads = OMP_GET_MAX_THREADS( )
!$ inform%threads = INT( OMP_GET_MAX_THREADS( ), KIND = ip_ )
inform%status = GALAHAD_ok
inform%alloc_status = 0 ; inform%bad_alloc = ''
inform%iter = 0
Expand Down Expand Up @@ -1797,7 +1797,7 @@ END SUBROUTINE eval_HOCPRODS

inform%NLS_inform%status = 1
data%nls%X( : data%nls%n ) = nlp%X
write(6,*) ' x ', nlp%X
! WRITE(6,*) ' x ', nlp%X
data%control%NLS_control%jacobian_available = 2
data%control%NLS_control%subproblem_control%jacobian_available = 2
data%control%NLS_control%hessian_available = 2
Expand Down Expand Up @@ -2704,14 +2704,14 @@ SUBROUTINE COLT_track( nlp, control, inform, data, userdata, &
! *-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*

! COLT_track, a method to track the value of "the" minimizer of
! 1/2 (f(x)-t)^2 + 1/2 ||c(x)||^2
! 1/2 (f(x)-t)^2 + 1/2 ||c(x)||^2
! for a sequence of equi-distributed values of t in [t_lower,t_upper]

! *-*-*-*-*-*-*-*-*-*-*-*- A R G U M E N T S -*-*-*-*-*-*-*-*-*-*-*-*-*-*-*-*
!
! All arguments as for COLT_solve, with additionally
!
! n_points is a scalar variable of type default integer, that holds the
! n_points is a scalar variable of type default integer, that holds the
! number of equi-distributed points t in [t_lower,t_upper] including
! the end points
!
Expand Down Expand Up @@ -2830,7 +2830,7 @@ END SUBROUTINE eval_HOCPRODS

! functions

!$ INTEGER ( KIND = ip_ ) :: OMP_GET_MAX_THREADS
!$ INTEGER :: OMP_GET_MAX_THREADS

CHARACTER ( LEN = LEN( TRIM( control%prefix ) ) - 2 ) :: prefix
IF ( LEN( TRIM( control%prefix ) ) > 2 ) &
Expand Down Expand Up @@ -2864,7 +2864,7 @@ END SUBROUTINE eval_HOCPRODS
10 CONTINUE

CALL CPU_time( data%time_start ) ; CALL CLOCK_time( data%clock_start )
!$ inform%threads = OMP_GET_MAX_THREADS( )
!$ inform%threads = INT( OMP_GET_MAX_THREADS( ), KIND = ip_ )
inform%status = GALAHAD_ok
inform%alloc_status = 0 ; inform%bad_alloc = ''
inform%iter = 0
Expand Down Expand Up @@ -3123,7 +3123,7 @@ END SUBROUTINE eval_HOCPRODS
data%target_upper = inform%obj
data%target_lower = - infinity
inform%target = t_lower
data%i_point = 1
data%i_point = 1
data%target_bounded = .FALSE.
data%converged = .FALSE.
data%nt = 0
Expand Down
2 changes: 1 addition & 1 deletion src/general/makemaster
Original file line number Diff line number Diff line change
Expand Up @@ -561,7 +561,7 @@ $(RLG)(ssids_$(PRECIS).o): ../dum/ssidss.F90
cd $(OBJ); $(RARR) ssids_$(PRECIS).o ; $(RM) ssids.F90 ssids_$(PRECIS).o
$(MVMODS)
$(RMARFILE) sls_$(PRECIS).o
$(RANLIB) $(RLGS)
$(RANLIB) $(RLG)
@printf '[ OK ]\n'

ssids_ciface.o: $(CLG)(ssids_ciface.o)
Expand Down
14 changes: 7 additions & 7 deletions src/lpb/lpb.F90
Original file line number Diff line number Diff line change
Expand Up @@ -1390,7 +1390,7 @@ SUBROUTINE LPB_solve( prob, data, control, inform, C_stat, X_stat )

! functions

!$ INTEGER ( KIND = ip_ ) :: OMP_GET_MAX_THREADS
!$ INTEGER :: OMP_GET_MAX_THREADS

! prefix for all output

Expand Down Expand Up @@ -1437,7 +1437,7 @@ SUBROUTINE LPB_solve( prob, data, control, inform, C_stat, X_stat )
inform%obj = - one ; inform%potential = infinity
inform%non_negligible_pivot = zero
inform%feasible = .FALSE.
!$ inform%threads = OMP_GET_MAX_THREADS( )
!$ inform%threads = INT( OMP_GET_MAX_THREADS( ), KIND = ip_ )
stat_required = PRESENT( C_stat ) .AND. PRESENT( X_stat )
cro_clock_matrix = 0.0_rp_

Expand Down Expand Up @@ -8252,7 +8252,7 @@ SUBROUTINE LPB_compute_pmaxstep( dims, n, m, nbnds, order, puiseux, &

! Functions

!$ INTEGER ( KIND = ip_ ) :: OMP_GET_THREAD_NUM
!$ INTEGER :: OMP_GET_THREAD_NUM

IF ( inform%threads == 1 ) parallel = .FALSE.
inform%status = GALAHAD_ok
Expand Down Expand Up @@ -8468,7 +8468,7 @@ SUBROUTINE LPB_compute_pmaxstep( dims, n, m, nbnds, order, puiseux, &
COEF( opj ) = c - scale * CS_coef( opj )
END DO
COEF( 0 ) = MAX( COEF( 0 ), zero )
!$ thread = OMP_get_thread_num( )
!$ thread = INT( OMP_get_thread_num( ), KIND = ip_ )
ALPHA_m( i ) = ROOTS_smallest_root_in_interval( &
COEF( 0 : 2 * order ), lower, upper, &
local_ROOTS_data( thread ), local_ROOTS_control, &
Expand Down Expand Up @@ -8500,7 +8500,7 @@ SUBROUTINE LPB_compute_pmaxstep( dims, n, m, nbnds, order, puiseux, &
COEF( opj ) = c - scale * CS_coef( opj )
END DO
COEF( 0 ) = MAX( COEF( 0 ), zero )
!$ thread = OMP_get_thread_num( )
!$ thread = INT( OMP_get_thread_num( ), KIND = ip_ )
ALPHA_m( i ) = ROOTS_smallest_root_in_interval( &
COEF( 0 : 2 * order ), lower, upper, &
local_ROOTS_data( thread ), local_ROOTS_control, &
Expand Down Expand Up @@ -8532,7 +8532,7 @@ SUBROUTINE LPB_compute_pmaxstep( dims, n, m, nbnds, order, puiseux, &
COEF( opj ) = c - scale * CS_coef( opj )
END DO
COEF( 0 ) = MAX( COEF( 0 ), zero )
!$ thread = OMP_get_thread_num( )
!$ thread = INT( OMP_get_thread_num( ), KIND = ip_ )
ALPHA_m( i ) = ROOTS_smallest_root_in_interval( &
COEF( 0 : 2 * order ), lower, upper, &
local_ROOTS_data( thread ), local_ROOTS_control, &
Expand Down Expand Up @@ -8564,7 +8564,7 @@ SUBROUTINE LPB_compute_pmaxstep( dims, n, m, nbnds, order, puiseux, &
COEF( opj ) = c - scale * CS_coef( opj )
END DO
COEF( 0 ) = MAX( COEF( 0 ), zero )
!$ thread = OMP_get_thread_num( )
!$ thread = INT( OMP_get_thread_num( ), KIND = ip_ )
ALPHA_m( i ) = ROOTS_smallest_root_in_interval( &
COEF( 0 : 2 * order ), lower, upper, &
local_ROOTS_data( thread ), local_ROOTS_control, &
Expand Down
1 change: 0 additions & 1 deletion src/nls/nls.F90
Original file line number Diff line number Diff line change
Expand Up @@ -1955,7 +1955,6 @@ END SUBROUTINE eval_SCALE
data%n_or_gn = .FALSE.
END IF
! WRITE( 6, * ) ' branch ', data%branch
SELECT CASE ( data%branch )
CASE ( 10 ) ! initialization
GO TO 10
CASE ( 20 ) ! re-entry without initialization
Expand Down

0 comments on commit 2160f01

Please sign in to comment.