Skip to content

Commit

Permalink
fixed warnings in pio_rearr_opts.F90.in
Browse files Browse the repository at this point in the history
  • Loading branch information
edhartnett committed Jun 25, 2019
1 parent 3c6cea0 commit 8f3fe00
Show file tree
Hide file tree
Showing 2 changed files with 5 additions and 10 deletions.
2 changes: 1 addition & 1 deletion tests/general/pio_decomp_frame_tests.F90.in
Original file line number Diff line number Diff line change
Expand Up @@ -319,7 +319,7 @@ PIO_TF_AUTO_TEST_SUB_BEGIN nc_reuse_3d_decomp
do j=1,ncols
do i=1,nrows
tmp_idx = (k - 1) * (ncols * nrows) + (j - 1) * nrows + i
compdof(tmp_idx) = exp_val4d(i,j,k,1)
compdof(tmp_idx) = int(exp_val4d(i,j,k,1))
end do
end do
end do
Expand Down
13 changes: 4 additions & 9 deletions tests/general/pio_rearr_opts.F90.in
Original file line number Diff line number Diff line change
Expand Up @@ -11,7 +11,6 @@ PIO_TF_AUTO_TEST_SUB_BEGIN init_fin_with_rearr_opts

integer, parameter :: NUM_REARRANGERS = 2
integer :: rearrs(NUM_REARRANGERS) = (/pio_rearr_subset,pio_rearr_box/)
character(len=PIO_TF_MAX_STR_LEN) :: rearrs_info(NUM_REARRANGERS) = (/"PIO_REARR_SUBSET","PIO_REARR_BOX "/)
type(pio_rearr_opt_t) :: pio_rearr_opts
! Dummy val for max pend req
integer, parameter :: MAX_PEND_REQ = 10
Expand Down Expand Up @@ -187,7 +186,6 @@ SUBROUTINE create_decomp_and_init_buf(iosys, iocomm, iodesc, wbuf, dims, ret)
integer, dimension(1), intent(out) :: dims
integer, intent(out) :: ret

integer :: pio_dim
integer, dimension(:), allocatable :: compdof
integer, dimension(1) :: start, count
integer :: i
Expand All @@ -203,7 +201,7 @@ SUBROUTINE create_decomp_and_init_buf(iosys, iocomm, iodesc, wbuf, dims, ret)
allocate(compdof(count(1)))
do i=1,count(1)
wbuf(i) = start(1) + i - 1
compdof(i) = wbuf(i)
compdof(i) = int(wbuf(i))
end do

call PIO_initdecomp(iosys, PIO_real, dims, compdof, iodesc)
Expand Down Expand Up @@ -248,7 +246,7 @@ END SUBROUTINE
! Open file and inq var
! All details are picked from pio_rearr_opts_tgv module
! Note: The file is kept open so the called needs to close it
SUBROUTINE open_file_and_get_var(iosys, pio_file, iotype, pio_var, dims, ret)
SUBROUTINE open_file_and_get_var(iosys, pio_file, iotype, pio_var, ret)
use pio_tutil
use pio_rearr_opts_tgv
implicit none
Expand All @@ -257,11 +255,8 @@ SUBROUTINE open_file_and_get_var(iosys, pio_file, iotype, pio_var, dims, ret)
type(file_desc_t), intent(out) :: pio_file
integer, intent(in) :: iotype
type(var_desc_t), intent(out) :: pio_var
integer, dimension(1), intent(in) :: dims
integer, intent(out) :: ret

integer :: pio_dim

ret = PIO_openfile(iosys, pio_file, iotype, tgv_fname, pio_write)
PIO_TF_CHECK_ERR(ret, "Could not create file " // trim(tgv_fname))

Expand Down Expand Up @@ -331,7 +326,7 @@ PIO_TF_AUTO_TEST_SUB_BEGIN write_with_rearr_opts
integer, dimension(:), allocatable :: iotypes
character(len=PIO_TF_MAX_STR_LEN), dimension(:), allocatable :: iotype_descs
integer :: num_iotypes
integer :: ret, ierr, i
integer :: ret, i

num_iotypes = 0
call PIO_TF_Get_nc_iotypes(iotypes, iotype_descs, num_iotypes)
Expand Down Expand Up @@ -436,7 +431,7 @@ PIO_TF_AUTO_TEST_SUB_BEGIN write_with_rearr_opts
rbuf = 0

call open_file_and_get_var(dup_iosys, pio_file, iotypes(i),&
pio_var, dims, ret)
pio_var, ret)
PIO_TF_CHECK_ERR(ret, dup_comm, "Creating file/decomp/var reqd for test failed :" // trim(tgv_fname))

call PIO_write_darray(pio_file, pio_var, iodesc, wbuf, ret)
Expand Down

0 comments on commit 8f3fe00

Please sign in to comment.