Skip to content

Commit e145ec5

Browse files
committed
fixed typo in comments
1 parent 85fb603 commit e145ec5

File tree

3 files changed

+7
-7
lines changed

3 files changed

+7
-7
lines changed

src/minpack.f90

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -27,7 +27,7 @@ subroutine func(n, x, fvec, iflag)
2727
import :: wp
2828
implicit none
2929
integer, intent(in) :: n !! the number of variables.
30-
real(wp), intent(in) :: x(n) !! independant variable vector
30+
real(wp), intent(in) :: x(n) !! independent variable vector
3131
real(wp), intent(out) :: fvec(n) !! value of function at `x`
3232
integer, intent(inout) :: iflag !! set to <0 to terminate execution
3333
end subroutine func
@@ -38,7 +38,7 @@ subroutine func2(m, n, x, fvec, iflag)
3838
implicit none
3939
integer, intent(in) :: m !! the number of functions.
4040
integer, intent(in) :: n !! the number of variables.
41-
real(wp), intent(in) :: x(n) !! independant variable vector
41+
real(wp), intent(in) :: x(n) !! independent variable vector
4242
real(wp), intent(out) :: fvec(m) !! value of function at `x`
4343
integer, intent(inout) :: iflag !! the value of iflag should not be changed unless
4444
!! the user wants to terminate execution of lmdif.
@@ -50,7 +50,7 @@ subroutine fcn_hybrj(n, x, fvec, fjac, ldfjac, iflag)
5050
import :: wp
5151
implicit none
5252
integer, intent(in) :: n !! the number of variables.
53-
real(wp), dimension(n), intent(in) :: x !! independant variable vector
53+
real(wp), dimension(n), intent(in) :: x !! independent variable vector
5454
integer, intent(in) :: ldfjac !! leading dimension of the array fjac.
5555
real(wp), dimension(n), intent(inout) :: fvec !! value of function at `x`
5656
real(wp), dimension(ldfjac, n), intent(inout) :: fjac !! jacobian matrix at `x`
@@ -79,7 +79,7 @@ subroutine fcn_lmder(m, n, x, fvec, fjac, ldfjac, iflag)
7979
!! the value of iflag should not be changed by fcn unless
8080
!! the user wants to terminate execution of lmder.
8181
!! in this case set iflag to a negative integer.
82-
real(wp), intent(in) :: x(n) !! independant variable vector
82+
real(wp), intent(in) :: x(n) !! independent variable vector
8383
real(wp), intent(inout) :: fvec(m) !! value of function at `x`
8484
real(wp), intent(inout) :: fjac(ldfjac, n) !! jacobian matrix at `x`
8585
end subroutine fcn_lmder
@@ -97,7 +97,7 @@ subroutine fcn_lmstr(m, n, x, fvec, fjrow, iflag)
9797
!! the value of iflag should not be changed by fcn unless
9898
!! the user wants to terminate execution of lmstr.
9999
!! in this case set iflag to a negative integer.
100-
real(wp), intent(in) :: x(n) !! independant variable vector
100+
real(wp), intent(in) :: x(n) !! independent variable vector
101101
real(wp), intent(inout) :: fvec(m) !! value of function at `x`
102102
real(wp), intent(inout) :: fjrow(n) !! jacobian row
103103
end subroutine fcn_lmstr

test/test_hybrd.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -114,7 +114,7 @@ subroutine fcn(n, x, Fvec, Iflag)
114114
implicit none
115115

116116
integer, intent(in) :: n !! the number of variables.
117-
real(wp), intent(in) :: x(n) !! independant variable vector
117+
real(wp), intent(in) :: x(n) !! independent variable vector
118118
real(wp), intent(out) :: fvec(n) !! value of function at `x`
119119
integer, intent(inout) :: iflag !! set to <0 to terminate execution
120120

test/test_lmder.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -136,7 +136,7 @@ subroutine fcn(m, n, x, Fvec, Fjac, Ldfjac, Iflag)
136136
!! the value of iflag should not be changed by fcn unless
137137
!! the user wants to terminate execution of lmder.
138138
!! in this case set iflag to a negative integer.
139-
real(wp), intent(in) :: x(n) !! independant variable vector
139+
real(wp), intent(in) :: x(n) !! independent variable vector
140140
real(wp), intent(inout) :: fvec(m) !! value of function at `x`
141141
real(wp), intent(inout) :: fjac(ldfjac, n) !! jacobian matrix at `x`
142142

0 commit comments

Comments
 (0)