[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2019-04-16 Thread danglin at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

John David Anglin  changed:

   What|Removed |Added

 Status|NEW |RESOLVED
 Resolution|--- |FIXED

--- Comment #29 from John David Anglin  ---
Fixed.

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2019-04-16 Thread danglin at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

--- Comment #28 from John David Anglin  ---
Author: danglin
Date: Wed Apr 17 00:22:23 2019
New Revision: 270402

URL: https://gcc.gnu.org/viewcvs?rev=270402=gcc=rev
Log:
PR libgfortran/79540
* io/write_float.def (build_float_string): Don't copy digits when
ndigits is negative.


Modified:
branches/gcc-7-branch/libgfortran/ChangeLog
branches/gcc-7-branch/libgfortran/io/write_float.def

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2019-04-16 Thread danglin at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

--- Comment #27 from John David Anglin  ---
Author: danglin
Date: Tue Apr 16 23:21:13 2019
New Revision: 270398

URL: https://gcc.gnu.org/viewcvs?rev=270398=gcc=rev
Log:
PR libgfortran/79540
* io/write_float.def (build_float_string): Don't copy digits when
ndigits is negative.


Modified:
branches/gcc-8-branch/libgfortran/ChangeLog
branches/gcc-8-branch/libgfortran/io/write_float.def

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2019-03-30 Thread jvdelisle at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

--- Comment #26 from Jerry DeLisle  ---
(In reply to Dominique d'Humieres from comment #25)
> Fixed on trunk so far.

Yes, OK to backport.

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2019-03-30 Thread dominiq at lps dot ens.fr
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

Dominique d'Humieres  changed:

   What|Removed |Added

Summary|[7/8/9 Regression] FAIL:|[7/8 Regression] FAIL:
   |gfortran.dg/fmt_fw_d.f90|gfortran.dg/fmt_fw_d.f90
   |-O0  execution test |-O0  execution test

--- Comment #25 from Dominique d'Humieres  ---
Fixed on trunk so far.

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2018-01-25 Thread rguenth at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

Richard Biener  changed:

   What|Removed |Added

   Target Milestone|7.3 |7.4

--- Comment #12 from Richard Biener  ---
GCC 7.3 is being released, adjusting target milestone.

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2017-10-05 Thread dave.anglin at bell dot net
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

--- Comment #11 from dave.anglin at bell dot net ---
# ./pr79540
 print '(f1.0)',100.00  ! => len=1 *: no digits print '(f2.0)',
   100.00  ! => len=0 : no digits
 print '(f3.0)',100.00  ! => len=0 : no digits
 print '(f1.1)',100.00  ! => len=1 *: no digits
 print '(f3.1)',100.00  ! => len=0 : no digits

--
John David Anglin   dave.ang...@bell.net

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2017-10-03 Thread dominiq at lps dot ens.fr
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

--- Comment #10 from Dominique d'Humieres  ---
Could you please post the result of

call verify_fmt(100.0)
end

! loop through values for w, d
subroutine verify_fmt(x)
real, intent(in) :: x
integer :: w, d
character(len=80) :: str, str0
integer :: len, len0, pos
do d = 0, 1
do w = 1, 3
str = fmt_w_d(x, w, d)
len = len_trim(str)

pos = verify(str(:len), "*")
if (pos == 0) call errormsg(x, str, len, w, d, "no digits")
end do
end do

end subroutine

function fmt_w_d(x, w, d)
real, intent(in) :: x
integer, intent(in) :: w, d
character(len=*) :: fmt_w_d
character(len=10) :: fmt, make_fmt

fmt = make_fmt(w, d)
write (fmt_w_d, fmt) x
end function

function make_fmt(w, d)
integer, intent(in) :: w, d
character(len=10) :: make_fmt

write (make_fmt,'("(f",i0,".",i0,")")') w, d
end function

subroutine errormsg(x, str, len, w, d, reason)
real, intent(in) :: x
character(len=80), intent(in) :: str
integer, intent(in) :: len, w, d
character(len=*), intent(in) :: reason
integer :: fmt_len
integer(1) :: slen
character(len=10) :: fmt, make_fmt

fmt = make_fmt(w, d)
fmt_len = len_trim(fmt)
slen=len

print *, "print '", fmt(:fmt_len), "', ", x, " ! => ", "len=", slen,
str(:len), ": ", reason
end subroutine

?

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2017-10-03 Thread dave.anglin at bell dot net
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

--- Comment #9 from dave.anglin at bell dot net ---
On 2017-10-01 7:33 AM, dominiq at lps dot ens.fr wrote:
> https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540
>
> --- Comment #8 from Dominique d'Humieres  ---
> Could you please uncomment the line
>
>  !print *, "print '", fmt(:fmt_len), "', ", x, " ! => ", str(:len), ": ",
> reason
>
> and post the result?
spawn [open ...]
  print '(f2.1)',    100.00  ! => ^@^@: no digits

Program aborted. Backtrace:

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2017-10-01 Thread dominiq at lps dot ens.fr
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

--- Comment #8 from Dominique d'Humieres  ---
Could you please uncomment the line

!print *, "print '", fmt(:fmt_len), "', ", x, " ! => ", str(:len), ": ",
reason

and post the result?

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2017-08-16 Thread rguenth at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

Richard Biener  changed:

   What|Removed |Added

   Target Milestone|7.2 |7.3

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2017-08-14 Thread rguenth at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

Richard Biener  changed:

   What|Removed |Added

   Target Milestone|7.2 |7.3

--- Comment #8 from Richard Biener  ---
GCC 7.2 is being released, adjusting target milestone.

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2017-06-09 Thread dave.anglin at bell dot net
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

--- Comment #7 from dave.anglin at bell dot net ---
On 2017-06-09 10:35 AM, jvdelisle at gcc dot gnu.org wrote:
> https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540
>
> --- Comment #6 from Jerry DeLisle  ---
> Some other bugs were fixed and I am wondering if this is still failing?
It's still failing as of r248904.

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2017-06-09 Thread jvdelisle at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

--- Comment #6 from Jerry DeLisle  ---
Some other bugs were fixed and I am wondering if this is still failing?

[Bug libfortran/79540] [7/8 Regression] FAIL: gfortran.dg/fmt_fw_d.f90 -O0 execution test

2017-05-02 Thread jakub at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79540

Jakub Jelinek  changed:

   What|Removed |Added

   Target Milestone|7.0 |7.2

--- Comment #5 from Jakub Jelinek  ---
GCC 7.1 has been released.