Skip to content

Commit

Permalink
Comment out the entire thing
Browse files Browse the repository at this point in the history
  • Loading branch information
minhqdao committed Aug 3, 2024
1 parent c41b90c commit cedebb6
Show file tree
Hide file tree
Showing 2 changed files with 18 additions and 18 deletions.
34 changes: 17 additions & 17 deletions src/stdlib_array_allocation.fypp
Original file line number Diff line number Diff line change
Expand Up @@ -11,25 +11,25 @@ contains

#:for k1, t1 in KINDS_TYPES
#:for rank in RANKS
!> Allocate an instance of the array within the wrapper.
module subroutine allocate_array_${t1[0]}$${k1}$_${rank}$(wrapper, source_array, stat, msg)
class(t_array_wrapper), intent(out) :: wrapper
${t1}$, intent(in) :: source_array${ranksuffix(rank)}$
integer, intent(out) :: stat
character(len=:), allocatable, intent(out) :: msg
! !> Allocate an instance of the array within the wrapper.
! module subroutine allocate_array_${t1[0]}$${k1}$_${rank}$(wrapper, source_array, stat, msg)
! class(t_array_wrapper), intent(out) :: wrapper
! ${t1}$, intent(in) :: source_array${ranksuffix(rank)}$
! integer, intent(out) :: stat
! character(len=:), allocatable, intent(out) :: msg

! allocate(t_array_${t1[0]}$${k1}$_${rank}$ :: wrapper%array, stat=stat)
! if (stat /= 0) then
! msg = "Failed to allocate array"; return
! end if
! ! allocate(t_array_${t1[0]}$${k1}$_${rank}$ :: wrapper%array, stat=stat)
! ! if (stat /= 0) then
! ! msg = "Failed to allocate array"; return
! ! end if

! select type (typed_array => wrapper%array)
! class is (t_array_${t1[0]}$${k1}$_${rank}$)
! typed_array%values = source_array
! class default
! msg = 'Failed to allocate values.'; stat = 1; return
! end select
end
! ! select type (typed_array => wrapper%array)
! ! class is (t_array_${t1[0]}$${k1}$_${rank}$)
! ! typed_array%values = source_array
! ! class default
! ! msg = 'Failed to allocate values.'; stat = 1; return
! ! end select
! end

#:endfor
#:endfor
Expand Down
2 changes: 1 addition & 1 deletion src/stdlib_io_np_load.fypp
Original file line number Diff line number Diff line change
Expand Up @@ -180,7 +180,7 @@ contains
& 'with total size of '//to_string(product(vshape)); return
end if

call allocate_array(arrays(i), array, stat, msg)
! call allocate_array(arrays(i), array, stat, msg)
if (stat /= 0) then
msg = "Failed to allocate array of type '"//this_type//"' "//&
& 'with total size of '//to_string(product(vshape)); return
Expand Down

0 comments on commit cedebb6

Please sign in to comment.