Skip to content

Commit a12c18d

Browse files
committed
temporary: verbose test result for CI error
1 parent 9b253b1 commit a12c18d

File tree

1 file changed

+12
-3
lines changed

1 file changed

+12
-3
lines changed

test/specialfunctions/test_specialfunctions_gamma.fypp

Lines changed: 12 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -5,6 +5,7 @@
55
module test_specialfunctions_gamma
66
use testdrive, only : new_unittest, unittest_type, error_type, check
77
use stdlib_kinds, only: sp, dp, xdp, qp, int8, int16, int32, int64
8+
use stdlib_error, only: state_type, STDLIB_VALUE_ERROR
89
use stdlib_specialfunctions_gamma, only: gamma, log_gamma, log_factorial, &
910
lower_incomplete_gamma, &
1011
upper_incomplete_gamma, &
@@ -113,7 +114,7 @@ contains
113114
#:endif
114115

115116
do i = 1, n
116-
117+
117118
call check(error, log_factorial(x(i)), ans(i), "Integer kind " &
118119
//"${k1}$ failed", thr = tol_dp, rel = .true.)
119120

@@ -130,6 +131,7 @@ contains
130131
type(error_type), allocatable, intent(out) :: error
131132
integer, parameter :: n = 5
132133
integer :: i
134+
type(state_type) :: err
133135

134136
#:if k1 == "int8"
135137

@@ -182,13 +184,20 @@ contains
182184
#:elif t1[0] == "c"
183185

184186
do i = 1, n
187+
188+
err = state_type(STDLIB_VALUE_ERROR,'Complex ${k1}$ failed: x=',x(i),' gamma=',gamma(x(i)), &
189+
'expected=',ans(i),' tol=',tol_${k1}$)
185190

186-
call check(error, gamma(x(i)), ans(i), "Complex kind ${k1}$ failed",&
191+
call check(error, gamma(x(i)), ans(i), err%print(),&
187192
thr = tol_${k1}$, rel = .true.)
188193

189-
end do
194+
!call check(error, gamma(x(i)), ans(i), "Complex kind ${k1}$ failed",&
195+
! thr = tol_${k1}$, rel = .true.)
190196

197+
end do
198+
191199
#:endif
200+
192201
end subroutine test_gamma_${t1[0]}$${k1}$
193202

194203

0 commit comments

Comments
 (0)