171b3c9fdc8599b78e55ea03022c3e6f348a5a76
[platform/upstream/gcc.git] / gcc / fortran / ChangeLog
1 2021-02-22  Tobias Burnus  <tobias@codesourcery.com>
2
3         PR fortran/99171
4         * trans-openmp.c (gfc_omp_is_optional_argument): Regard optional
5         dummy procs as nonoptional as no special treatment is needed.
6
7 2021-02-21  Harald Anlauf  <anlauf@gmx.de>
8
9         * trans-expr.c (gfc_conv_procedure_call): Do not add clobber to
10         allocatable intent(out) argument.
11
12 2021-02-19  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
13
14         PR fortran/98686
15         * match.c (gfc_match_namelist): If BT_UNKNOWN, check for
16         IMPLICIT NONE and and issue an error, otherwise set the type
17         to its IMPLICIT type so that any subsequent use of objects will
18         will confirm their types.
19
20 2021-02-19  Harald Anlauf  <anlauf@gmx.de>
21
22         * symbol.c (gfc_add_flavor): Reverse order of conditions.
23
24 2021-02-19  Tobias Burnus  <tobias@codesourcery.com>
25
26         PR fortran/99010
27         * dependency.c (gfc_dep_resolver): Fix coarray handling.
28
29 2021-02-19  Tobias Burnus  <tobias@codesourcery.com>
30
31         PR fortran/99146
32         * interface.c:
33
34 2021-02-19  Tobias Burnus  <tobias@codesourcery.com>
35
36         PR fortran/99027
37         * simplify.c (simplify_bound_dim): Honor DIMEN_ELEMENT
38         when using dim=.
39
40 2021-02-17  Julian Brown  <julian@codesourcery.com>
41
42         * openmp.c (resolve_omp_clauses): Disallow selecting components
43         of arrays of derived type.
44
45 2021-02-17  Julian Brown  <julian@codesourcery.com>
46
47         * trans-openmp.c (gfc_trans_omp_clauses): Handle element selection
48         for arrays of derived types.
49
50 2021-02-16  Tobias Burnus  <tobias@codesourcery.com>
51
52         * expr.c (gfc_is_simplify_contiguous): Handle REF_INQUIRY, i.e.
53         %im and %re which are EXPR_VARIABLE.
54         * openmp.c (resolve_omp_clauses): Diagnose %re/%im explicitly.
55
56 2021-02-16  Tobias Burnus  <tobias@codesourcery.com>
57
58         PR fortran/99111
59         * io.c (resolve_tag_format): Reject BT_DERIVED/CLASS/VOID
60         as (array-valued) FORMAT tag.
61
62 2021-02-12  Tobias Burnus  <tobias@codesourcery.com>
63
64         PR fortran/99043
65         * trans-expr.c (gfc_conv_procedure_call): Don't reset
66         rank of assumed-rank array.
67
68 2021-02-11  Paul Thomas  <pault@gcc.gnu.org>
69
70         PR fortran/98897
71         * match.c (gfc_match_call): Include associate names as possible
72         entities with typebound subroutines. The target needs to be
73         resolved for the type.
74
75 2021-02-11  Paul Thomas  <pault@gcc.gnu.org>
76
77         PR fortran/99060
78         * primary.c (gfc_match_varspec): Test for non-null 'previous'
79         before using its name in the error message.
80
81 2021-02-11  Tobias Burnus  <tobias@codesourcery.com>
82
83         * intrinsic.texi (FINDLOC): Add 'MASK' to argument table.
84         (MAXLOC, MAXVAL, MINLOC, MINVAL): For 'MASK', remove 'an
85         array' as scalars are also permitted.
86
87 2021-02-10  Julian Brown  <julian@codesourcery.com>
88
89         PR fortran/98979
90         * openmp.c (resolve_omp_clauses): Omit OpenACC update in
91         contiguity check and stride-specified error.
92
93 2021-02-04  Julian Brown  <julian@codesourcery.com>
94
95         * openmp.c (resolve_omp_clauses): Omit OpenACC update in
96         contiguity check and stride-specified error.
97
98 2021-02-04  Julian Brown  <julian@codesourcery.com>
99
100         * trans-openmp.c (gfc_trans_omp_clauses): Use class_pointer attribute
101         for BT_CLASS.
102
103 2021-02-04  Julian Brown  <julian@codesourcery.com>
104
105         * trans-openmp.c (gfc_trans_omp_clauses): Fix dereferencing for
106         BT_DERIVED members.
107
108 2021-02-04  Tobias Burnus  <tobias@codesourcery.com>
109
110         * openmp.c (resolve_omp_clauses): Explicitly diagnose
111         substrings as not permitted.
112
113 2021-02-03  Jeff Law  <law@redhat.com>
114
115         * intrinsic.texi (ANINT): Fix typo.
116
117 2021-02-03  Tobias Burnus  <tobias@codesourcery.com>
118
119         PR fortran/98913
120         * dependency.c (gfc_dep_resolver): Treat local access
121         to coarrays like any array access in dependency analysis.
122
123 2021-01-28  Harald Anlauf  <anlauf@gmx.de>
124
125         PR fortran/86470
126         * trans.c (gfc_call_malloc): Allocate area of size 1 if passed
127         size is NULL (as documented).
128
129 2021-01-27  Paul Thomas  <pault@gcc.gnu.org>
130
131         PR fortran/93924
132         PR fortran/93925
133         * trans-expr.c (gfc_conv_procedure_call): Suppress the call to
134         gfc_conv_intrinsic_to_class for unlimited polymorphic procedure
135         pointers.
136         (gfc_trans_assignment_1): Similarly suppress class assignment
137         for class valued procedure pointers.
138
139 2021-01-27  Paul Thomas  <pault@gcc.gnu.org>
140
141         PR fortran/98472
142         * trans-array.c (gfc_conv_expr_descriptor): Include elemental
143         procedure pointers in the assert under the comment 'elemental
144         function' and eliminate the second, spurious assert.
145
146 2021-01-25  Harald Anlauf  <anlauf@gmx.de>
147
148         PR fortran/70070
149         * data.c (create_character_initializer): Check substring indices
150         against bounds.
151         (gfc_assign_data_value): Catch error returned from
152         create_character_initializer.
153
154 2021-01-25  Tobias Burnus  <tobias@codesourcery.com>
155
156         * intrinsic.texi (CO_BROADCAST, CO_MIN, CO_REDUCE, CO_SUM): Fix typos.
157
158 2021-01-25  Steve Kargl  <kargl@gcc.gnu.org>
159
160         PR fortran/98517
161         * resolve.c (resolve_charlen): Check that length expression is
162         present before testing for scalar/integer..
163
164 2021-01-22  Paul Thomas  <pault@gcc.gnu.org>
165
166         PR fortran/98565
167         * trans-intrinsic.c (gfc_conv_associated): Do not add a _data
168         component for scalar class function targets. Instead, fix the
169         function result and access the _data from that.
170
171 2021-01-21  Jorge D'Elia  <jdelia@cimec.unl.edu.ar>
172
173         * intrinsic.texi (CO_MAX): Fix typo.
174
175 2021-01-21  Paul Thomas  <pault@gcc.gnu.org>
176
177         PR fortran/96320
178         * decl.c (gfc_match_modproc): It is not an error to find a
179         module procedure declaration within a contains block.
180         * expr.c (gfc_check_vardef_context): Pure procedure result is
181         assignable. Change 'own_scope' accordingly.
182         * resolve.c (resolve_typebound_procedure): A procedure that
183         has the module procedure attribute is almost certainly a
184         module procedure, whatever its interface.
185
186 2021-01-19  Tobias Burnus  <tobias@codesourcery.com>
187
188         PR fortran/98476
189         * openmp.c (resolve_omp_clauses): Change use_device_ptr
190         to use_device_addr for unless type(c_ptr); check all
191         list item for is_device_ptr.
192
193 2021-01-16  Kwok Cheung Yeung  <kcy@codesourcery.com>
194
195         * dump-parse-tree.c (show_omp_clauses): Handle detach clause.
196         * frontend-passes.c (gfc_code_walker): Walk detach expression.
197         * gfortran.h (struct gfc_omp_clauses): Add detach field.
198         (gfc_c_intptr_kind): New.
199         * openmp.c (gfc_free_omp_clauses): Free detach clause.
200         (gfc_match_omp_detach): New.
201         (enum omp_mask1): Add OMP_CLAUSE_DETACH.
202         (enum omp_mask2): Remove OMP_CLAUSE_DETACH.
203         (gfc_match_omp_clauses): Handle OMP_CLAUSE_DETACH for OpenMP.
204         (OMP_TASK_CLAUSES): Add OMP_CLAUSE_DETACH.
205         (resolve_omp_clauses): Prevent use of detach with mergeable and
206         overriding the data sharing mode of the event handle.
207         * trans-openmp.c (gfc_trans_omp_clauses): Handle detach clause.
208         * trans-types.c (gfc_c_intptr_kind): New.
209         (gfc_init_kinds): Initialize gfc_c_intptr_kind.
210         * types.def
211         (BT_FN_VOID_OMPFN_PTR_OMPCPYFN_LONG_LONG_BOOL_UINT_PTR_INT): Rename
212         to...
213         (BT_FN_VOID_OMPFN_PTR_OMPCPYFN_LONG_LONG_BOOL_UINT_PTR_INT_PTR):
214         ...this.  Add extra argument.
215
216 2021-01-14  Harald Anlauf  <anlauf@gmx.de>
217
218         * gfortran.h (gfc_resolve_substring): Add prototype.
219         * primary.c (match_string_constant): Simplify substrings with
220         constant starting and ending points.
221         * resolve.c: Rename resolve_substring to gfc_resolve_substring.
222         (gfc_resolve_ref): Use renamed function gfc_resolve_substring.
223
224 2021-01-14  Harald Anlauf  <anlauf@gmx.de>
225
226         PR fortran/98661
227         * resolve.c (resolve_component): Derived type components with
228         ALLOCATABLE or POINTER attribute shall have a deferred shape.
229
230 2021-01-14  Harald Anlauf  <anlauf@gmx.de>
231
232         Revert:
233         2021-01-14  Harald Anlauf  <anlauf@gmx.de>
234
235         PR fortran/98661
236         * resolve.c (resolve_component): Derived type components with
237         ALLOCATABLE or POINTER attribute shall have a deferred shape.
238
239 2021-01-14  Harald Anlauf  <anlauf@gmx.de>
240
241         PR fortran/98661
242         * resolve.c (resolve_component): Derived type components with
243         ALLOCATABLE or POINTER attribute shall have a deferred shape.
244
245 2021-01-08  Paul Thomas  <pault@gcc.gnu.org>
246
247         PR fortran/93794
248         * trans-expr.c (gfc_conv_component_ref): Remove the condition
249         that deferred character length components only be allocatable.
250
251 2021-01-08  Paul Thomas  <pault@gcc.gnu.org>
252
253         PR fortran/98458
254         * simplify.c (is_constant_array_expr): If an array constructor
255         expression has elements other than constants or structures, try
256         fixing the expression with gfc_reduce_init_expr. Also, if shape
257         is NULL, obtain the array size and set it.
258
259 2021-01-07  Paul Thomas  <pault@gcc.gnu.org>
260
261         PR fortran/93701
262         * resolve.c (find_array_spec): Put static prototype for
263         resolve_assoc_var before this function and call for associate
264         variables.
265
266 2021-01-06  Harald Anlauf  <anlauf@gmx.de>
267
268         * resolve.c (resolve_component): Add check for valid CLASS
269         reference before trying to access CLASS data.
270
271 2021-01-04  Martin Liska  <mliska@suse.cz>
272
273         * ChangeLog-2018: Remove duplicate ChangeLog entries.
274
275 2021-01-01  Harald Anlauf  <anlauf@gmx.de>
276
277         * class.c (gfc_find_vtab): Add check on attribute is_class.
278
279 2021-01-01  Jakub Jelinek  <jakub@redhat.com>
280
281         * gfortranspec.c (lang_specific_driver): Update copyright notice
282         dates.
283         * gfc-internals.texi: Bump @copying's copyright year.
284         * gfortran.texi: Ditto.
285         * intrinsic.texi: Ditto.
286         * invoke.texi: Ditto.
287
288 2021-01-01  Jakub Jelinek  <jakub@redhat.com>
289
290         * ChangeLog-2020: Rotate ChangeLog.  New file.
291
292 \f
293 Copyright (C) 2021 Free Software Foundation, Inc.
294
295 Copying and distribution of this file, with or without modification,
296 are permitted in any medium without royalty provided the copyright
297 notice and this notice are preserved.