50 REAL(mpd),
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
51 INTEGER(mpl),
INTENT(IN) :: length
52 CHARACTER (LEN=*),
INTENT(IN) :: text
55 ALLOCATE (array(length),stat=ifail)
61 REAL(mps),
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
62 INTEGER(mpl),
INTENT(IN) :: length
63 CHARACTER (LEN=*),
INTENT(IN) :: text
66 ALLOCATE (array(length),stat=ifail)
72 INTEGER(mpi),
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
73 INTEGER(mpl),
INTENT(IN) :: length
74 CHARACTER (LEN=*),
INTENT(IN) :: text
77 ALLOCATE (array(length),stat=ifail)
83 REAL(mps),
DIMENSION(:,:),
INTENT(IN OUT),
ALLOCATABLE :: array
84 INTEGER(mpl),
INTENT(IN) :: rows
85 INTEGER(mpl),
INTENT(IN) :: cols
86 CHARACTER (LEN=*),
INTENT(IN) :: text
89 ALLOCATE (array(rows,cols),stat=ifail)
95 INTEGER(mpi),
DIMENSION(:,:),
INTENT(IN OUT),
ALLOCATABLE :: array
96 INTEGER(mpl),
INTENT(IN) :: rows
97 INTEGER(mpl),
INTENT(IN) :: cols
98 CHARACTER (LEN=*),
INTENT(IN) :: text
100 INTEGER(mpi) :: ifail
101 ALLOCATE (array(rows,cols),stat=ifail)
107 INTEGER(mpl),
DIMENSION(:,:),
INTENT(IN OUT),
ALLOCATABLE :: array
108 INTEGER(mpl),
INTENT(IN) :: rows
109 INTEGER(mpl),
INTENT(IN) :: cols
110 CHARACTER (LEN=*),
INTENT(IN) :: text
112 INTEGER(mpi) :: ifail
113 ALLOCATE (array(rows,cols),stat=ifail)
119 TYPE(
listitem),
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
120 INTEGER(mpl),
INTENT(IN) :: length
121 CHARACTER (LEN=*),
INTENT(IN) :: text
123 INTEGER(mpi) :: ifail
124 ALLOCATE (array(length),stat=ifail)
130 CHARACTER,
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
131 INTEGER(mpl),
INTENT(IN) :: length
132 CHARACTER (LEN=*),
INTENT(IN) :: text
134 INTEGER(mpi) :: ifail
135 ALLOCATE (array(length),stat=ifail)
141 INTEGER(mpi),
INTENT(IN) :: ifail
142 INTEGER(mpl),
INTENT(IN) :: numwords
143 CHARACTER (LEN=*),
INTENT(IN) :: text
149 print *,
' MPALLOC allocated ', numwords,
' words for : ', text
153 print *,
' MPALLOC failed to allocate ', numwords,
' words for : ', text
155 print *,
' MPALLOC stat = ', ifail
156 CALL peend(30,
'Aborted, memory allocation failed')
163 REAL(mpd),
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
165 INTEGER(mpi) :: ifail
166 INTEGER(mpl) :: isize
167 isize = (mpd*
size(array,kind=
mpl))/
mpi
168 DEALLOCATE (array,stat=ifail)
174 REAL(mps),
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
176 INTEGER(mpi) :: ifail
177 INTEGER(mpl) :: isize
178 isize = (mps*
size(array,kind=
mpl))/
mpi
179 DEALLOCATE (array,stat=ifail)
185 INTEGER(mpi),
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
187 INTEGER(mpi) :: ifail
188 INTEGER(mpl) :: isize
189 isize =
size(array,kind=
mpl)
190 DEALLOCATE (array,stat=ifail)
196 REAL(mps),
DIMENSION(:,:),
INTENT(IN OUT),
ALLOCATABLE :: array
198 INTEGER(mpi) :: ifail
199 INTEGER(mpl) :: isize
200 isize = (mps*
size(array,kind=
mpl))/
mpi
201 DEALLOCATE (array,stat=ifail)
207 INTEGER(mpi),
DIMENSION(:,:),
INTENT(IN OUT),
ALLOCATABLE :: array
209 INTEGER(mpi) :: ifail
210 INTEGER(mpl) :: isize
211 isize =
size(array,kind=
mpl)
212 DEALLOCATE (array,stat=ifail)
218 INTEGER(mpl),
DIMENSION(:,:),
INTENT(IN OUT),
ALLOCATABLE :: array
220 INTEGER(mpi) :: ifail
221 INTEGER(mpl) :: isize
223 DEALLOCATE (array,stat=ifail)
229 TYPE(
listitem),
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
231 INTEGER(mpi) :: ifail
232 INTEGER(mpl) :: isize
234 DEALLOCATE (array,stat=ifail)
240 CHARACTER,
DIMENSION(:),
INTENT(IN OUT),
ALLOCATABLE :: array
242 INTEGER(mpi) :: ifail
243 INTEGER(mpl) :: isize
245 DEALLOCATE (array,stat=ifail)
251 INTEGER(mpi),
INTENT(IN) :: ifail
252 INTEGER(mpl),
INTENT(IN) :: numwords
257 print *,
' MPDEALLOC deallocated ', numwords,
' words '
261 print *,
' MPDEALLOC failed to deallocate ', numwords,
' words'
263 print *,
' MPDEALLOC stat = ', ifail
264 CALL peend(31,
'Aborted, memory deallocation failed')
(De)Allocate vectors and arrays.
subroutine mpdeallocfvec(array)
deallocate (1D) single precision array
subroutine mpalloclist(array, length, text)
allocate (1D) list item array
subroutine mpallocivec(array, length, text)
allocate (1D) integer array
subroutine mpalloclarr(array, rows, cols, text)
allocate (2D) large integer array
subroutine mpdealloccvec(array)
deallocate (1D) character array
subroutine mpallocfvec(array, length, text)
allocate (1D) single precision array
subroutine mpalloccvec(array, length, text)
allocate (1D) character array
integer(mpl) maxwordsalloc
peak dynamic memory allocation (words)
integer(mpi) nummpdealloc
number of dynamic deallocations
integer(mpi) printflagalloc
print flag for dynamic allocations
subroutine mpdeallocdvec(array)
deallocate (1D) double precision array
subroutine mpdealloccheck(ifail, numwords)
check deallocation
subroutine mpdealloclarr(array)
deallocate (2D) large integer array
subroutine mpalloccheck(ifail, numwords, text)
check allocation
subroutine mpallocfarr(array, rows, cols, text)
allocate (2D) single precision array
integer(mpl) numwordsalloc
current dynamic memory allocation (words)
subroutine mpdeallocivec(array)
deallocate (1D) integer array
integer(mpi) nummpalloc
number of dynamic allocations
subroutine mpallociarr(array, rows, cols, text)
allocate (2D) INTEGER(mpi) array
subroutine mpdealloclist(array)
deallocate (1D) list item array
subroutine mpallocdvec(array, length, text)
allocate (1D) double precision array
subroutine mpdeallociarr(array)
allocate (2D) integer array
subroutine mpdeallocfarr(array)
allocate (2D) single precision array
subroutine peend(icode, cmessage)
Print exit code.
list items from steering file