2016-12-07 Steven G. Kargl <kargl@gcc.gnu.org>
[official-gcc.git] / gcc / fortran / ChangeLog
blobeb5e987128cd2afa35cdb05ae54d6798ff1505e6
1 2016-12-08  Steven G. Kargl  <kargl@gcc.gnu.org>
3         PR fortran/65173
4         PR fortran/69064
5         PR fortran/69859
6         PR fortran/78350
7         * gfortran.h (gfc_namespace): Remove old_cl_list member.
8         * parse.c (use_modules, next_statement): old_cl_list is gone.
9         (clear_default_charlen): Remove no longer used function.
10         (reject_statement): Do not try ot clean up gfc_charlen structure(s)
11         that may have been added to a cl_list list.
12         * symbol.c (gfc_new_charlen): old_cl_list structure is gone.
14 2016-12-06  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
16         PR fortran/78659
17         * resolve.c (resolve_fl_namelist): Remove unneeded error.
19 2016-12-06  Andre Vehreschild  <vehre@gcc.gnu.org>
21         PR fortran/78226
22         * class.c (finalize_component): Add missing locus information.
23         (finalization_scalarizer): Likewise.
24         (finalization_get_offset): Likewise.
25         (finalizer_insert_packed_call): Likewise.
26         (generate_finalization_wrapper): Likewise.
28 2016-12-05  Nathan Sidwell  <nathan@acm.org>
30         * error.c (gfc_warning_check): Call diagnostic_check_max_errors.
31         (gfc_error_check): Likewise.
33 2016-12-04  Janus Weil  <janus@gcc.gnu.org>
35         PR fortran/78618
36         * intrinsic.c (gfc_convert_type_warn): Do not set the full typespec for
37         the conversion symbol, but only type and kind. Set the full typespec
38         for the expression.
39         (gfc_convert_chartype): Ditto.
41 2016-12-03  Janus Weil  <janus@gcc.gnu.org>
43         PR fortran/43207
44         * primary.c (gfc_match_varspec): Reject nonpolymorphic references to
45         abstract types.
47 2016-12-03  Janus Weil  <janus@gcc.gnu.org>
49         PR fortran/42188
50         * primary.c (gfc_match_rvalue): Add a new check that gives better error
51         messages.
53 2016-12-03  Janus Weil  <janus@gcc.gnu.org>
55         PR fortran/58175
56         * resolve.c (gfc_resolve_finalizers): Prevent bogus warning.
58 2016-12-02  Steven G. Kargl  <kargl@gcc.gnu.org>
60         * simplify.c (gfc_convert_char_constant): Free result on error.
62 2016-12-02  Janus Weil  <janus@gcc.gnu.org>
63             Steven G. Kargl  <kargl@gcc.gnu.org>
65         PR fortran/78618
66         * check.c (gfc_check_rank): Remove ATTRIBUTE_UNUSED.
67         * expr.c (gfc_check_assign): Fix error propagation.
69 2016-12-01  Elizebeth Punnoose  <elizebeth.punnoose@hpe.com>
71         PR fortran/77505
72         * trans-array.c (trans_array_constructor): Treat negative character
73         length as LEN = 0.
75 2016-12-01  Steven G. Kargl  <kargl@gcc.gnu.org>
77         PR fortran/78279
78         * dependency.c (identical_array_ref): Convert gcc_assert to conditional
79         and gfc_internal_error.
81 2016-11-30  Andre Vehreschild  <vehre@gcc.gnu.org>
83         * check.c (gfc_check_allocated): By pass the caf_get call and check on
84         the array.
85         * gfortran.h: Add optional flag to gfc_caf_attr.
86         * gfortran.texi: Document new enum values and _caf_is_present function.
87         * primary.c (caf_variable_attr): Add optional flag to indicate that the
88         expression is reffing a component.
89         (gfc_caf_attr): Likewise.
90         * trans-array.c (gfc_array_deallocate): Handle deallocation mode for
91         coarray deregistration.
92         (gfc_trans_dealloc_allocated): Likewise.
93         (duplicate_allocatable): Use constants instead of
94         creating custom constant tree node of zero or one.  Use gfc_add_modify
95         convenience function.
96         (duplicate_allocatable_coarray): This function is similar to
97         duplicate_allocatable but tailored to handle coarrays.
98         (caf_enabled): Check whether in-derived-type coarray processing is
99         enabled.
100         (caf_in_coarray): Check that in-derived-type coarray processing is
101         enabled and currently in a derived-typed coarray.
102         (gfc_caf_is_dealloc_only): Return true, when deallocate only is
103         desired for components in derived typed coarrays.
104         (structure_alloc_comps): A mode for handling coarrays, that is no
105         longer encode in the purpose.  This makes the use cases of the
106         routine more flexible without repeating.  Allocatable components in
107         derived type coarrays are now registered only when nullifying an
108         object and allocated before copying data into them.
109         (gfc_nullify_alloc_comp): Use the caf_mode of structure_alloc_comps
110         now.
111         (gfc_deallocate_alloc_comp): Likewise.
112         (gfc_deallocate_alloc_comp_no_caf): Likewise.
113         (gfc_reassign_alloc_comp_caf): Likewise.
114         (gfc_copy_alloc_comp): Likewise.
115         (gfc_copy_only_alloc_comp): Likewise.
116         (gfc_alloc_allocatable_for_assignment): Make use to the cheaper way of
117         reallocating a coarray without deregistering and reregistering it.
118         (gfc_trans_deferred_array): Initialize the coarray token correctly for
119         deferred variables and tear them down on exit.
120         * trans-array.h: Change some prototypes to add the coarray (de-)
121         registration modes.  Add prototype for checking if deallocate only is
122         selected for components in derived typed coarrays.
123         * trans-decl.c (gfc_build_builtin_function_decls): Generate the
124         declarations for the changed/new caf-lib routines.
125         (gfc_trans_deferred_vars): Ensure deferred variables are (de-)
126         registered correctly on procedure entry/exit.
127         (generate_coarray_sym_init): Use constants.
128         * trans-expr.c (gfc_conv_procedure_call): Propagate coarray allocation
129         modes accordingly.
130         (gfc_trans_alloc_subarray_assign): Likewise.
131         (gfc_trans_subcomponent_assign): Likewise.
132         (gfc_trans_structure_assign): Generate code to register the components
133         of a derived type coarray prior to initialization.
134         (gfc_conv_structure): Set flag that the structure is in a coarray.
135         (gfc_trans_scalar_assign): Add flag to indicate being in a coarray and
136         set the structure_alloc_comps modes correctly.
137         (gfc_trans_assignment_1): Figure being in a coarray expression.
138         * trans-intrinsic.c (gfc_conv_intrinsic_caf_get): Adapt to new
139         structure_alloc_comps interface.
140         (conv_caf_send): Use the old API as long as possible.
141         (trans_caf_is_present): Generate code to check whether an allocatable
142         component in a derived typed coarray is allocated on a remote image.
143         (caf_this_image_ref): Return true, when only reffing this image.
144         (gfc_conv_allocated): Convert allocated queries on allocatable
145         components to the library API.
146         (conv_intrinsic_move_alloc): Adapt to new interface of
147         structure_alloc_comps.
148         * trans-openmp.c (gfc_walk_alloc_comps): Likewise.
149         (gfc_omp_clause_assign_op): Likewise.
150         (gfc_omp_clause_dtor): Likewise.
151         * trans-stmt.c (gfc_trans_deallocate): Figure which mode to use when
152         deallocating allocatable components in derived type coarras.
153         * trans.c (gfc_allocate_using_lib): Renamed to
154         gfc_allcate_using_caf_lib.
155         (gfc_allocate_allocatable): Set the registration mode/type of caf-
156         register calls adapting to all the possible allocatable objects.
157         (gfc_deallocate_with_status): Add deregistration mode for allocatable
158         components in derived type coarrays.
159         (gfc_deallocate_scalar_with_status): Likewise.
160         * trans.h (enum gfc_coarray_type): Renamed to gfc_coarray_regtype to
161         avoid collision with gfc_coarray_deregtype.
163 2016-11-30  Janus Weil  <janus@gcc.gnu.org>
165         PR fortran/78593
166         * primary.c (gfc_match_varspec): Check if sym is non-null to avoid ICE.
168 2016-11-30  Janus Weil  <janus@gcc.gnu.org>
170         PR fortran/78592
171         * interface.c (gfc_find_specific_dtio_proc): Rearrange code to avoid
172         dereferencing a null pointer.
174 2016-11-30  Janus Weil  <janus@gcc.gnu.org>
176         PR fortran/78573
177         * decl.c (build_struct): On error, return directly and do not build
178         class symbol.
180 2016-11-29  Tobias Burnus  <burnus@net-b.de>
182         PR fortran/58175
183         * resolve.c (gfc_resolve_finalizers): Properly detect scalar finalizers.
185 2016-11-27  Paul Thomas  <pault@gcc.gnu.org>
187         PR fortran/78474
188         * module.c (gfc_match_submodule): If there is more than one
189         colon, it is a syntax error.
191         PR fortran/78331
192         * module.c (gfc_use_module): If an smod file does not exist it
193         is either because the module does not have a module procedure
194         interface or there is an error in the module.
196 2016-11-25  Janne Blomqvist  <jb@gcc.gnu.org>
198         * intrinsic.texi: Fix ptrdiff_t typo in ISO_C_BINDING constants
199         table.
201 2016-11-25  Janus Weil  <janus@gcc.gnu.org>
203         PR fortran/60853
204         * interface.c (gfc_compare_interfaces): Remove bad special case for
205         unlimited polymorphism. Refactor for loop.
207 2016-11-25  Andre Vehreschild  <vehre@gcc.gnu.org>
208             Paul Thomas  <pault@gcc.gnu.org>
210         PR fortran/78293
211         * trans-expr.c (gfc_conv_procedure_call): Prepend deallocation
212         of alloctable components to post, rather than adding to
213         se->post.
214         * trans-stmt.c (gfc_trans_allocate): Move deallocation of expr3
215         allocatable components so that all expr3s are visited.
217 2016-11-25  Paul Thomas  <pault@gcc.gnu.org>
219         PR fortran/78293
220         * gfortran.dg/allocatable_function_10.f90: New test.
221         * gfortran.dg/class_array_15.f03: Increase builtin_free count
222         from 11 to 12.
224 2016-11-24  Steven G. Kargl  <kargl@gcc.gnu.org>
226         PR fortran/78500
227         * expr.c (gfc_check_vardef_contextm): Fix NULL pointer dereference.
228         * interface.c (matching_typebound_op): Ditto.
230 2016-11-23  Steven G. Kargl  <kargl@gcc.gnu.org>
232         PR fortran/78297
233         * trans-common.c (finish_equivalences): Do not dereference a NULL pointer.
235 2016-11-23  Martin Jambor  <mjambor@suse.cz>
237         * f95-lang.c (DEF_HSA_BUILTIN): New macro.
239 2016-11-22  Steven G. Kargl  <kargl@gcc.gnu.org>
241         PR fortran/78479
242         * expr.c (gfc_apply_init):  Allocate a charlen if needed.
244 2016-11-22  Janus Weil  <janus@gcc.gnu.org>
246         PR fortran/78443
247         * class.c (add_proc_comp): Add a vtype component for non-overridable
248         procedures that are overriding.
250 2016-11-20  Harald Anlauf  <anlauf@gmx.de>
252         PR fortran/69741
253         * resolve.c (gfc_resolve_forall): Check for nonscalar index variables.
255 2016-11-20  Andre Vehreschild  <vehre@gcc.gnu.org>
257         PR fortran/78395
258         * resolve.c (resolve_typebound_function): Prevent stripping of refs,
259         when the base-expression is a class' typed one.
261 2016-11-18  Richard Sandiford  <richard.sandiford@arm.com>
262             Alan Hayward  <alan.hayward@arm.com>
263             David Sherwood  <david.sherwood@arm.com>
265         * trans-common.c (build_common_decl): Use SET_DECL_MODE.
266         * trans-decl.c (gfc_build_label_decl): Likewise.
267         * trans-types.c (gfc_get_array_descr_info): Likewise.
269 2016-11-17  Janus Weil  <janus@gcc.gnu.org>
271         PR fortran/66227
272         * simplify.c (gfc_simplify_extends_type_of): Fix missed optimization.
273         Prevent over-simplification. Fix a comment. Add a comment.
275 2016-11-16  Steven G. Kargl  <kargl@gcc.gnu.org>
277         PR fortran/58001
278         * io.c (next_char_not_space): Update handling of a 'tab' in a FORMAT.
279         (format_lex): Adjust invocations of next_char_not_space().
281 2016-11-16  Andre Vehreschild  <vehre@gcc.gnu.org>
283         PR fortran/78356
284         * class.c (gfc_is_class_scalar_expr): Prevent taking an array ref for
285         a component ref.
286         * trans-expr.c (gfc_trans_assignment_1): Ensure a reference to the
287         object to copy is generated, when assigning class objects.
289 2016-11-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
291         * dump-parse-tree.c (show_code):  Add prototype.
292         (gfc_debug_code):  New function.
293         (show_code_node):  Add space after SELECT TYPE.
295 2016-11-14  Janus Weil  <janus@gcc.gnu.org>
297         PR fortran/78300
298         * resolve.c (resolve_procedure_interface): Properly handle CLASS-valued
299         function results.
301 2016-11-13  Janus Weil  <janus@gcc.gnu.org>
303         PR fortran/60952
304         * decl.c (match_procedure_in_type): Apply the FL_PROCEDURE attribute
305         to the target procedure.
307 2016-11-13  Janus Weil  <janus@gcc.gnu.org>
309         PR fortran/66366
310         * resolve.c (resolve_component): Move check for C437
311         to ...
312         * decl.c (build_struct): ... here. Fix indentation.
314 2016-11-12  Janus Weil  <janus@gcc.gnu.org>
316         PR fortran/77501
317         * class.c (gfc_find_typebound_intrinsic_op): Remove an unnecessary
318         assert and nullification.
319         * decl.c (gfc_match_decl_type_spec): Use gfc_get_tbp_symtree,
320         fix indentation.
321         (gfc_match_generic): Remove an unnecessary assert.
322         Use gfc_get_tbp_symtree to avoid ICE.
324 2016-11-10  Fritz O. Reese <fritzoreese@gmail.com>
326         PR fortran/78277
327         * gcc/fortran/decl.c (gfc_match_data_decl): Gracefully handle bad
328         anonymous structure declarations.
330 2016-11-10  Fritz O. Reese <fritzoreese@gmail.com>
332         * decl.c (get_struct_decl, gfc_match_map, gfc_match_union): Fix
333         whitespace.
334         * interface.c (gfc_compare_union_types): Likewise.
336 2016-11-10  Jakub Jelinek  <jakub@redhat.com>
338         * cpp.c (cpp_define_builtins): Define _OPENMP to 201511 instead
339         of 201307.
340         * gfortran.texi: Mention partial OpenMP 4.5 support.
341         * intrinsic.texi: Update for OpenMP 4.5.
343         * openmp.c (gfc_free_omp_clauses): Free critical_name, grainsize,
344         hint, num_tasks, priority and if_exprs.
345         (gfc_match_omp_to_link, gfc_match_omp_depend_sink): New functions.
346         (enum omp_mask1, enum omp_mask2): New enums.
347         Change all OMP_CLAUSE_* defines into enum values, and change their
348         values from ((uint64_t) 1 << bit) to just bit.
349         (omp_mask, omp_inv_mask): New classes.  Add ctors and operators.
350         (gfc_match_omp_clauses): Change mask argument from uint64_t to
351         const omp_mask.  Assert OMP_MASK1_LAST and OMP_MASK2_LAST are
352         at most 64.  Move delete clause handling to where it
353         alphabetically belongs.  Parse defaultmap, grainsize, hint,
354         is_device_ptr, nogroup, nowait, num_tasks, priority, simd, threads
355         and use_device_ptr clauses.  Parse if clause modifier.  Parse map
356         clause always modifier, and release and delete kinds.  Parse ordered
357         clause with argument.  Parse schedule clause modifiers.  Differentiate
358         device clause parsing based on openacc flag.  Guard link clause
359         parsing with openacc flag.  Add support for parsing
360         linear clause modifiers.  Parse depend(source) and depend(sink: ...).
361         Use gfc_match_omp_to_link for to and link clauses in declare target
362         construct.
363         (match_acc): Change mask type from uint64_t to const omp_mask.
364         (OMP_SINGLE_CLAUSES, OMP_ORDERED_CLAUSES,
365         OMP_DECLARE_TARGET_CLAUSES, OMP_TASKLOOP_CLAUSES,
366         OMP_TARGET_ENTER_DATA_CLAUSES, OMP_TARGET_EXIT_DATA_CLAUSES): Define.
367         (OACC_PARALLEL_CLAUSES, OACC_KERNELS_CLAUSES, OACC_DATA_CLAUSES,
368         OACC_LOOP_CLAUSES, OACC_HOST_DATA_CLAUSES, OACC_DECLARE_CLAUSES,
369         OACC_ENTER_DATA_CLAUSES, OACC_EXIT_DATA_CLAUSES, OACC_WAIT_CLAUSES,
370         OACC_ROUTINE_CLAUSES, OMP_PARALLEL_CLAUSES, OMP_DECLARE_SIMD_CLAUSES,
371         OMP_SECTIONS_CLAUSES, OMP_TEAMS_CLAUSES, OMP_DISTRIBUTE_CLAUSES):
372         Replace first or only OMP_CLAUSE_* value in bitset with
373         omp_mask (OMP_CLAUSE_*).
374         (OMP_DO_CLAUSES): Likewise.  Add OMP_CLAUSE_LINEAR.
375         (OMP_SIMD_CLAUSES): Replace first or only OMP_CLAUSE_* value in
376         bitset with omp_mask (OMP_CLAUSE_*).  Add OMP_CLAUSE_SIMDLEN.
377         (OACC_UPDATE_CLAUSES): Replace first or only OMP_CLAUSE_* value in
378         bitset with omp_mask (OMP_CLAUSE_*).  Replace OMP_CLAUSE_OACC_DEVICE
379         with OMP_CLAUSE_DEVICE.
380         (OMP_TASK_CLAUSES): Replace first or only OMP_CLAUSE_* value in
381         bitset with omp_mask (OMP_CLAUSE_*).  Add OMP_CLAUSE_PRIORITY.
382         (OMP_TARGET_CLAUSES): Replace first or only OMP_CLAUSE_* value in
383         bitset with omp_mask (OMP_CLAUSE_*).  Add OMP_CLAUSE_DEPEND,
384         OMP_CLAUSE_NOWAIT, OMP_CLAUSE_PRIVATE, OMP_CLAUSE_FIRSTPRIVATE,
385         OMP_CLAUSE_DEFAULTMAP and OMP_CLAUSE_IS_DEVICE_PTR.
386         (OMP_TARGET_DATA_CLAUSES): Replace first or only OMP_CLAUSE_* value in
387         bitset with omp_mask (OMP_CLAUSE_*).  Add OMP_CLAUSE_USE_DEVICE_PTR.
388         (OMP_TARGET_UPDATE_CLAUSES): Replace first or only OMP_CLAUSE_* value
389         in bitset with omp_mask (OMP_CLAUSE_*).  Add OMP_CLAUSE_DEPEND and
390         OMP_CLAUSE_NOWAIT.
391         (match_omp): Change mask argument from unsigned int to
392         const omp_mask.
393         (gfc_match_omp_critical): Parse optional clauses and use omp_clauses
394         union member instead of omp_name.
395         (gfc_match_omp_end_critical): New function.
396         (gfc_match_omp_distribute_parallel_do): Remove ordered and linear
397         clauses from the mask.
398         (gfc_match_omp_distribute_parallel_do_simd): Use
399         & ~(omp_mask (OMP_CLAUSE_*)) instead of & ~OMP_CLAUSE_*.
400         (gfc_match_omp_target_teams_distribute_parallel_do_simd): Likewise.
401         (gfc_match_omp_teams_distribute_parallel_do_simd): Likewise.
402         (gfc_match_omp_do_simd): Likewise.  Don't remove ordered clause from
403         the mask.
404         (gfc_match_omp_parallel_do_simd): Likewise.
405         (gfc_match_omp_target_teams_distribute_parallel_do): Likewise.
406         (gfc_match_omp_teams_distribute_parallel_do): Likewise.
407         (gfc_match_omp_declare_simd): If not using the form with
408         (proc-name), require space before first clause.  Make (proc-name)
409         optional.  If not present, set proc_name to NULL.
410         (gfc_match_omp_declare_target): Rewritten for OpenMP 4.5.
411         (gfc_match_omp_single): Use OMP_SINGLE_CLAUSES.
412         (gfc_match_omp_task, gfc_match_omp_taskwait, gfc_match_omp_taskyield):
413         Move around to where they belong alphabetically.
414         (gfc_match_omp_target_enter_data, gfc_match_omp_target_exit_data,
415         gfc_match_omp_target_parallel, gfc_match_omp_target_parallel_do,
416         gfc_match_omp_target_parallel_do_simd, gfc_match_omp_target_simd,
417         gfc_match_omp_taskloop, gfc_match_omp_taskloop_simd):
418         New functions.
419         (gfc_match_omp_ordered): Parse clauses.
420         (gfc_match_omp_ordered_depend): New function.
421         (gfc_match_omp_cancel, gfc_match_omp_end_single): Use
422         omp_mask (OMP_CLAUSE_*) instead of OMP_CLAUSE_*.
423         (resolve_oacc_scalar_int_expr): Renamed to ...
424         (resolve_scalar_int_expr): ... this.  Fix up formatting.
425         (resolve_oacc_positive_int_expr): Renamed to ...
426         (resolve_positive_int_expr): ... this.  Fix up formatting.
427         (resolve_nonnegative_int_expr): New function.
428         (resolve_omp_clauses): Adjust callers, use the above functions
429         even for OpenMP clauses, add handling of new OpenMP 4.5 clauses.
430         Require orderedc >= collapse if specified. Handle depend(sink:)
431         and depend(source) restrictions.  Disallow linear clause when
432         orderedc is non-zero.  Diagnose linear clause modifiers when not in
433         declare simd.  Only check for integer type if ref modifier
434         is not used.  Remove diagnostics for required VALUE attribute.
435         Diagnose VALUE attribute with ref or uval modifiers.  Allow
436         non-constant linear-step, if it is a dummy argument alone and is
437         mentioned in uniform clause.  Diagnose map kinds not allowed
438         for various constructs.  Diagnose target {enter ,exit ,}data without
439         any map clauses.  Add dummy OMP_LIST_IS_DEVICE_PTR and
440         OMP_LIST_USE_DEVICE_PTR cases.
441         (gfc_resolve_omp_do_blocks): Set omp_current_do_collapse to orderedc
442         if non-zero.
443         (gfc_resolve_omp_parallel_blocks): Handle new OpenMP 4.5 constructs,
444         replace underscores with spaces in a few construct names.
445         (resolve_omp_do): Set collapse to orderedc if non-zero.  Handle new
446         OpenMP 4.5 constructs.
447         (resolve_oacc_loop_blocks): Call resolve_positive_int_expr instead
448         of resolve_oacc_positive_int_expr.
449         (gfc_resolve_omp_directive): Handle new OpenMP 4.5 constructs.
450         (gfc_resolve_omp_declare_simd): Allow ods->proc_name to be NULL.
451         * trans-openmp.c (gfc_omp_scalar_p): New function.
452         (doacross_steps): New variable.
453         (gfc_trans_omp_clauses): Handle new OpenMP 4.5 clauses and new clause
454         modifiers.
455         (gfc_trans_omp_critical): Adjust EXEC_OMP_CRITICAL handling.
456         (gfc_trans_omp_do): Handle doacross loops.  Clear sched_simd flag.
457         Handle EXEC_OMP_TASKLOOP.
458         (gfc_trans_omp_ordered): Translate omp clauses, allow NULL
459         code->block.
460         (GFC_OMP_SPLIT_TASKLOOP, GFC_OMP_MASK_TASKLOOP): New enum constants.
461         (gfc_split_omp_clauses): Copy orderedc together with ordered.  Change
462         firstprivate and lastprivate handling for OpenMP 4.5.
463         Handle EXEC_OMP_TARGET_SIMD, EXEC_OMP_TARGET_PARALLEL{,_DO,_DO_SIMD}
464         and EXEC_OMP_TASKLOOP{,_SIMD}.  Add handling for new OpenMP 4.5
465         clauses and clause modifiers and handle if clause without/with
466         modifiers.
467         (gfc_trans_omp_teams): Add omp_clauses argument, add it to other
468         teams clauses.  Don't wrap into OMP_TEAMS if -fopenmp-simd.
469         (gfc_trans_omp_target): For -fopenmp, translate num_teams and
470         thread_limit clauses on combined target teams early and pass to
471         gfc_trans_omp_teams.  Set OMP_TARGET_COMBINED if needed.
472         Handle EXEC_OMP_TARGET_PARALLEL{,_DO,_DO_SIMD} and
473         EXEC_OMP_TARGET_SIMD.
474         (gfc_trans_omp_taskloop, gfc_trans_omp_target_enter_data,
475         gfc_trans_omp_target_exit_data): New functions.
476         (gfc_trans_omp_directive): Handle EXEC_OMP_TARGET_{ENTER,EXIT}_DATA
477         EXEC_OMP_TASKLOOP{,_SIMD}, EXEC_OMP_TARGET_PARALLEL{,_DO,_DO_SIMD}
478         and EXEC_OMP_TARGET_SIMD.  Adjust gfc_trans_omp_teams caller.
479         * symbol.c (check_conflict): Handle omp_declare_target_link.
480         (gfc_add_omp_declare_target_link): New function.
481         (gfc_copy_attr): Copy omp_declare_target_link.
482         * dump-parse-tree.c (show_omp_namelist): Handle OMP_DEPEND_SINK_FIRST
483         depend_op.  Print linear clause modifiers.
484         (show_omp_clauses): Adjust for OpenMP 4.5 clause changes.
485         (show_omp_node): Print clauses for EXEC_OMP_ORDERED.  Allow NULL
486         c->block for EXEC_OMP_ORDERED.  Formatting fixes.  Adjust handling of
487         EXEC_OMP_CRITICAL, handle new OpenMP 4.5 constructs and some
488         forgotten OpenMP 4.0 constructs.
489         (show_code_node): Handle new OpenMP 4.5 constructs and some forgotten
490         OpenMP 4.0 constructs.
491         * gfortran.h (symbol_attribute): Add omp_declare_target_link bitfield.
492         (struct gfc_omp_namelist): Add u.common and u.linear_op fields.
493         (struct gfc_common_head): Change omp_declare_target into bitfield.
494         Add omp_declare_target_link bitfield.
495         (gfc_add_omp_declare_target_link): New prototype.
496         (enum gfc_statement): Add ST_OMP_TARGET_PARALLEL,
497         ST_OMP_END_TARGET_PARALLEL, ST_OMP_TARGET_PARALLEL_DO,
498         ST_OMP_END_TARGET_PARALLEL_DO, ST_OMP_TARGET_PARALLEL_DO_SIMD,
499         ST_OMP_END_TARGET_PARALLEL_DO_SIMD, ST_OMP_TARGET_ENTER_DATA,
500         ST_OMP_TARGET_EXIT_DATA, ST_OMP_TARGET_SIMD, ST_OMP_END_TARGET_SIMD,
501         ST_OMP_TASKLOOP, ST_OMP_END_TASKLOOP, ST_OMP_TASKLOOP_SIMD,
502         ST_OMP_END_TASKLOOP_SIMD and ST_OMP_ORDERED_DEPEND.
503         (enum gfc_omp_depend_op): Add OMP_DEPEND_SINK_FIRST and
504         OMP_DEPEND_SINK.
505         (enum gfc_omp_linear_op): New.
506         (struct gfc_omp_clauses): Add critical_name, depend_source,
507         orderedc, defaultmap, nogroup, sched_simd, sched_monotonic,
508         sched_nonmonotonic, simd, threads, grainsize, hint, num_tasks,
509         priority and if_exprs fields.
510         (enum gfc_exec_op): Add EXEC_OMP_END_CRITICAL,
511         EXEC_OMP_TARGET_ENTER_DATA, EXEC_OMP_TARGET_EXIT_DATA,
512         EXEC_OMP_TARGET_PARALLEL, EXEC_OMP_TARGET_PARALLEL_DO,
513         EXEC_OMP_TARGET_PARALLEL_DO_SIMD, EXEC_OMP_TARGET_SIMD,
514         EXEC_OMP_TASKLOOP, EXEC_OMP_TASKLOOP_SIMD.
515         (enum gfc_omp_map_op): Add OMP_MAP_RELEASE,
516         OMP_MAP_ALWAYS_TO, OMP_MAP_ALWAYS_FROM and OMP_MAP_ALWAYS_TOFROM.
517         (OMP_LIST_IS_DEVICE_PTR, OMP_LIST_USE_DEVICE_PTR): New.
518         (enum gfc_omp_if_kind): New.
519         * module.c (enum ab_attribute): Add AB_OMP_DECLARE_TARGET_LINK.
520         (attr_bits): Add AB_OMP_DECLARE_TARGET_LINK entry.
521         (mio_symbol_attribute): Save and restore omp_declare_target_link bit.
522         * trans.h (gfc_omp_scalar_p): New prototype.
523         * frontend-passes.c (gfc_code_walker): Handle new OpenMP 4.5
524         expressions.
525         * trans.c (trans_code): Handle new OpenMP 4.5 constructs.
526         * resolve.c (gfc_resolve_blocks): Likewise.
527         (gfc_resolve_code): Likewise.
528         * f95-lang.c (LANG_HOOKS_OMP_SCALAR_P): Redefine to gfc_omp_scalar_p.
529         (gfc_attribute_table): Add "omp declare target link".
530         * st.c (gfc_free_statement): Handle EXEC_OMP_END_CRITICAL like
531         EXEC_OMP_CRITICAL before, free clauses for EXEC_OMP_CRITICAL
532         and new OpenMP 4.5 constructs.  Free omp clauses even for
533         EXEC_OMP_ORDERED.
534         * match.c (match_exit_cycle): Rename collapse variable to count,
535         set it to orderedc if non-zero, instead of collapse.
536         * trans-decl.c (add_attributes_to_decl): Add "omp declare target link"
537         instead of "omp declare target" for omp_declare_target_link.
538         * trans-common.c (build_common_decl): Likewise.
539         * match.h (gfc_match_omp_target_enter_data,
540         gfc_match_omp_target_exit_data, gfc_match_omp_target_parallel,
541         gfc_match_omp_target_parallel_do,
542         gfc_match_omp_target_parallel_do_simd, gfc_match_omp_target_simd,
543         gfc_match_omp_taskloop, gfc_match_omp_taskloop_simd,
544         gfc_match_omp_end_critical, gfc_match_omp_ordered_depend): New
545         prototypes.
546         * parse.c (decode_omp_directive): Use gfc_match_omp_end_critical
547         instead of gfc_match_omp_critical for !$omp end critical.
548         Handle new OpenMP 4.5 constructs.  If ordered directive has
549         depend clause as the first of the clauses, use
550         gfc_match_omp_ordered_depend and ST_OMP_ORDERED_DEPEND instead of
551         gfc_match_omp_ordered and ST_OMP_ORDERED.
552         (case_executable): Add ST_OMP_TARGET_ENTER_DATA,
553         ST_OMP_TARGET_EXIT_DATA and ST_OMP_ORDERED_DEPEND cases.
554         (case_exec_markers): Add ST_OMP_TARGET_PARALLEL,
555         ST_OMP_TARGET_PARALLEL_DO, ST_OMP_TARGET_PARALLEL_DO_SIMD,
556         ST_OMP_TARGET_SIMD, ST_OMP_TASKLOOP and ST_OMP_TASKLOOP_SIMD cases.
557         (gfc_ascii_statement): Handle new OpenMP 4.5 constructs.
558         (parse_omp_do): Handle ST_OMP_TARGET_PARALLEL_DO,
559         ST_OMP_TARGET_PARALLEL_DO_SIMD, ST_OMP_TASKLOOP and
560         ST_OMP_TASKLOOP_SIMD.
561         (parse_omp_structured_block): Handle EXEC_OMP_END_CRITICAL instead
562         of EXEC_OMP_CRITICAL, adjust for EXEC_OMP_CRITICAL having omp clauses
563         now.
564         (parse_executable): Handle ST_OMP_TARGET_PARALLEL,
565         ST_OMP_TARGET_PARALLEL_DO, ST_OMP_TARGET_PARALLEL_DO_SIMD,
566         ST_OMP_TASKLOOP and ST_OMP_TASKLOOP_SIMD.
568 2016-11-09  Mikael Morin  <mikael@gcc.gnu.org>
569             Janus Weil  <janus@gcc.gnu.org>
571         PR fortran/46459
572         * interface.c (compare_actual_formal): Add safety checks to avoid ICE.
574 2016-11-09  Fritz O. Reese <fritzoreese@gmail.com>
576         PR fortran/78259
577         * trans-expr.c (gfc_trans_subcomponent_assign): Guard against NULL
578         values.
580 2016-11-09  Steven G. Kargl  <kargl@gcc.gnu.org>
581             Janus Weil  <janus@gcc.gnu.org>
583         PR fortran/60777
584         * expr.c (external_spec_function): Allow recursive specification
585         functions in F03.
587 2016-11-09  Paul Thomas  <pault@gcc.gnu.org>
589         * check.c (gfc_check_move_alloc): Prevent error that avoids
590         aliasing between to and from arguments from rejecting valid
591         code.
593 2016-11-09  Janus Weil  <janus@gcc.gnu.org>
595         PR fortran/71894
596         * class.c (gfc_add_component_ref): Add safety checks to avoid ICE.
598 2016-11-08  Janus Weil  <janus@gcc.gnu.org>
600         PR fortran/68440
601         * expr.c (check_alloc_comp_init): Loosen an assert.
602         * resolve.c (resolve_fl_parameter): Reject class parameters.
604 2016-11-08  Janus Weil  <janus@gcc.gnu.org>
606         PR fortran/77596
607         * expr.c (gfc_check_pointer_assign): Add special check for procedure-
608         pointer component with absent interface.
610 2016-11-07  Thomas Koenig  <tkoenig@gcc.gnu.org>
612         PR fortran/78226
613         * expr.c (gfc_generate_initializer):  Add where to EXPR_NULL
614         statement.
615         * iresolve.c (gfc_resolve_extends_type_of):  Add where to
616         both arguments of the function.
617         * resolve.c (resolve_select_type):  Add where to the
618         second argument of the new statement.
620 2016-11-07  Thomas Koenig  <tkoenig@gcc.gnu.org>
622         PR fortran/78226
623         * match.c (gfc_match_select_type):  Add where for expr1.
624         * resolve.c (resolev_select_type): Add where for expr1 of new
625         statement.
627 2016-11-06  Thomas Koenig  <tkoenig@gcc.gnu.org>
629         PR fortran/78226
630         resolve.c (build_loc_call): Add location to return value.
632 2016-11-06  Andre Vehreschild  <vehre@gcc.gnu.org>
634         * expr.c (is_non_empty_structure_constructor): New function to detect
635         non-empty structure constructor.
636         (gfc_has_default_initializer): Analyse initializers.
637         * resolve.c (cond_init): Removed.
638         (resolve_allocate_expr): Removed dead code.  Moved invariant code out
639         of the loop over all objects to allocate.
640         (resolve_allocate_deallocate): Added the invariant code remove from
641         resolve_allocate_expr.
642         * trans-array.c (gfc_array_allocate): Removed nullify of structure
643         components in favour of doing this in gfc_trans_allocate for both
644         scalars and arrays in the same place.
645         * trans-expr.c (gfc_trans_init_assign): Always using _vptr->copy for
646         class objects.
647         * trans-stmt.c (allocate_get_initializer): Get the initializer
648         expression for object allocated.
649         (gfc_trans_allocate): Nullify a derived type only, when no SOURCE=
650         or MOLD= is present preventing duplicate work.  Moved the creation
651         of the init-expression here to prevent code for conditions that
652         can not occur on freshly allocated object, like checking for the need
653         to free allocatable components.
655 2016-11-06  Thomas Koenig  <tkoenig@gcc.gnu.org>
657         PR fortran/78221
658         * arith.c (gfc_complex2real):  Change gfc_warning_now to
659         gfc_warning.
661 2016-11-05  Paul Thomas  <pault@gcc.gnu.org>
663         * check.c (gfc_check_move_alloc): Introduce error to prevent
664         aliasing between to and from arguments.
666 2016-11-05  Janus Weil  <janus@gcc.gnu.org>
667             Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
669         PR fortran/69495
670         * invoke.texi: Mention -Wpedantic as an alias of -pedantic.
671         * check.c (gfc_check_transfer): Mention responsible flag in warning
672         message.
673         * frontend-passes.c (do_warn_function_elimination): Ditto.
674         * resolve.c (resolve_elemental_actual): Ditto.
675         (resolve_operator): Ditto.
676         (warn_unused_fortran_label): Ditto.
677         * trans-common.c (translate_common): Ditto.
679 2016-11-05  Paul Thomas  <pault@gcc.gnu.org>
681         PR fortran/67564
682         * trans-expr.c (gfc_conv_class_to_class): Return _len component
683         of unlimited polymorphic entities.
685 2016-11-04  Paul Thomas  <pault@gcc.gnu.org>
687         PR fortran/64933
688         * primary.c (gfc_match_varspec): If selector expression is
689         unambiguously an array, make sure that the associate name
690         is an array and has an array spec. Modify the original
691         condition for doing this to exclude character types.
693 2016-11-03  Fritz Reese <fritzoreese@gmail.com>
695         * gfortran.texi: Document.
696         * gfortran.h (gfc_dt): New field default_exp.
697         * primary.c (match_real_constant): Default exponent with -fdec.
698         * io.c (match_io): Set dt.default_exp with -fdec.
699         * ioparm.def (IOPARM_dt_default_exp): New.
700         * trans-io.c (build_dt): Set IOPARM_dt_default_exp with -fdec.
702 2016-11-03  Fritz O. Reese <fritzoreese@gmail.com>
704         * decl.c (gfc_match_parameter): Allow omitted '()' with -std=legacy.
705         * parse.c (decode_statement): Match "parameter" before assignments.
706         * gfortran.texi: Document.
708 2016-11-02  Fritz O. Reese <fritzoreese@gmail.com>
710         * lang.opt, invoke.texi: New argument -Wargument-mismatch.
711         * interface.c (compare_parameter, compare_actual_formal,
712         gfc_check_typebound_override, argument_rank_mismatch): Control argument
713         mismatch warnings with -Wargument-mismatch.
714         * resolve.c (resolve_structure_cons, resolve_global_procedure): Ditto.
716 2016-11-02  Fritz Reese <fritzoreese@gmail.com>
718         * gfortran.h (gfc_error): New declaration for gfc_error with 'opt'.
719         * error.c (gfc_error): Add optional 'opt' argument.
720         * error.c (gfc_notify_std): Call fully-qualified gfc_error.
722 2016-11-01  Thomas Koenig  <tkoenig@gcc.gnu.org>
724         PR fortran/78178
725         * match.c (match_simple_where):  Fill in locus for assigment
726         in simple WHERE statement.
728 2016-11-01  Thomas Koenig  <tkoenig@gcc.gnu.org>
730         PR fortran/69544
731         * match.c (gfc_match_where):  Fill in locus for assigment
732         in simple WHERE statement.
734 2016-10-31  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
736         PR fortran/54679
737         * io.c (check_format): Adjust checks for FMT_L to treat a zero
738         width as an extension, giving warnings or error as appropriate.
739         Improve messages.
741 2016-10-31  Jakub Jelinek  <jakub@redhat.com>
743         * trans-types.c (gfc_get_array_descr_info): For -gdwarf-5 or
744         -gno-strict-dwarf, handle assumed rank arrays the way dwarf2out
745         expects.
747 2016-10-30  Thomas Koenig  <tkoenig@gcc.gnu.org>
749         PR fortran/67219
750         * arith.c (gfc_int2real):  Change gfc_warning_now
751         to gfc_warning.
752         * primary.c (match_complex_constant):  If there
753         is no comma, throw away any warning which might have
754         been issued by gfc_int2real.
756 2016-10-28  Steven G. Kargl <kargl@gcc.gnu.org>
758         PR fortran/71891
759         * symbol.c (gfc_type_compatible): Fix typo.
761 2016-10-27  Jakub Jelinek  <jakub@redhat.com>
763         PR fortran/78026
764         * parse.c (decode_statement): Don't create namespace for possible
765         select type here and destroy it afterwards.
766         (parse_select_type_block): Set gfc_current_ns to new_st.ext.block.ns.
767         (parse_executable, gfc_parse_file): Formatting fixes.
768         * match.c (gfc_match_select_type): Create namespace for select type
769         here, only after matching select type.  Formatting fixes.  Free that
770         namespace if not returning MATCH_YES, after gfc_undo_symbols,
771         otherwise remember it in new_st.ext.block.ns and switch to parent
772         namespace anyway.
774 2016-10-27  Fritz Reese  <fritzoreese@gmail.com>
776         * expr.c (generate_union_initializer, get_union_initializer): New.
777         * expr.c (component_initializer): Consider BT_UNION specially.
778         * resolve.c (resolve_structure_cons): Hack for BT_UNION.
779         * trans-expr.c (gfc_trans_subcomponent_assign): Ditto.
780         * trans-expr.c (gfc_conv_union_initializer): New.
781         * trans-expr.c (gfc_conv_structure): Replace UNION handling code with
782         new function gfc_conv_union_initializer.
784 2016-10-26  Steven G. Kargl <kargl@gcc.gnu.org>
786         PR fortran/78092
787         * trans-intrinsic.c (gfc_conv_intrinsic_sizeof):  Fix reference to an
788         array element of type CLASS.
790 2016-10-26  Paul Thomas  <pault@gcc.gnu.org>
792         PR fortran/78108
793         * resolve.c (resolve_typebound_intrinsic_op): For submodules
794         suppress the error and return if the same procedure symbol
795         is added more than once to the interface.
797 2016-10-26  Fritz Reese  <fritzoreese@gmail.com>
799         * frontend-passes.c (gfc_code_walker): Add SHARE and CARRIAGECONTROL.
800         * io.c (gfc_free_open, gfc_resolve_open, gfc_match_open): Ditto.
801         * gfortran.h (gfc_open): Add SHARE, CARRIAGECONTROL, and READONLY.
802         * io.c (io_tag, match_open_element): Ditto.
803         * ioparm.def: Ditto.
804         * trans-io.c (gfc_trans_open): Ditto.
805         * io.c (match_dec_etag, match_dec_ftag): New functions.
806         * gfortran.texi: Document.
808 2016-10-25  Fritz Reese  <fritzoreese@gmail.com>
810         * gfortran.texi: Document.
811         * resolve.c (logical_to_bitwise): New function.
812         * resolve.c (resolve_operator): Wrap operands with logical_to_bitwise.
814 2016-10-25  Andre Vehreschild  <vehre@gcc.gnu.org>
816         PR fortran/72770
817         * class.c (find_intrinsic_vtab): No longer encode the string length
818         into vtype's name and use the char's kind for the size instead of
819         the string_length time the size.
820         * trans-array.c (gfc_conv_ss_descriptor): For deferred length char
821         arrays the dynamically sized type needs to be declared.
822         (build_class_array_ref): Address the i-th array element by multiplying
823         it with the _vptr->_size and the _len to make sure char arrays are
824         addressed correctly.
825         * trans-expr.c (gfc_conv_intrinsic_to_class): Made comment more
826         precise.
828 2016-10-25  Cesar Philippidis  <cesar@codesourcery.com>
830         * intrinsic.texi (cosd): New mathop.
832 2016-10-25  Fritz Reese  <fritzoreese@gmail.com>
834         * match.c (gfc_match_intrinsic_op): Match ".XOR." with -std=legacy.
835         * gfortran.texi: Document.
837 2016-10-25  Fritz Reese  <fritzoreese@gmail.com>
839         * primary.c (gfc_match_rvalue): Match %LOC as LOC with -std=legacy.
840         * gfortran.texi: Document.
842 2016-10-25  Fritz Reese  <fritzoreese@gmail.com>
844         * decl.c (gfc_match_type): New function.
845         * match.h (gfc_match_type): New function.
846         * match.c (gfc_match_if): Special case for one-line IFs.
847         * gfortran.texi: Update documentation.
848         * parse.c (decode_statement): Invoke gfc_match_type.
850 2016-10-25  Fritz Reese  <fritzoreese@gmail.com>
852         * gfortran.texi: Document.
853         * gfortran.h (gfc_is_whitespace): Include form feed ('\f').
855 2016-10-25  Fritz Reese  <fritzoreese@gmail.com>
857         * invoke.texi, gfortran.texi: Touch up documentation of -fdec.
858         * gfortran.h (gfc_option): Move flag_dec_structure out of gfc_option.
859         * decl.c (match_record_decl, gfc_match_decl_type_spec,
860         gfc_match_structure_decl): Ditto.
861         * match.c (gfc_match_member_sep): Ditto.
862         * options.c (gfc_handle_option): Ditto.
863         * lang.opt (fdec-structure): Use Fortran Var for flag_dec_structure.
864         * lang.opt (fdec): Use Fortran Var to create flag_dec.
865         * options.c (set_dec_flags): With -fdec enable -fcray-pointer,
866         -fd-lines-as-comments (default), -fdollar-ok, and legacy std flags.
868 2016-10-24  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
870         PR fortran/77828
871         * ioparm.def: Reorder dt parameters to match libgfortran.
872         * libgfortran.h: Swap definitions of GFC_INTERNAL_UNIT and
873         GFC_INTERNAL_UNIT4.
875 2016-10-24  Steven G. Kargl  <kargl@gcc.gnu.org>
877         PR fortran/71895
878         * interface.c (gfc_compare_derived_types):  Convert gcc_assert()
879         to a gfc_internal_error() to prevent an ICE.
881 2016-10-24  Jakub Jelinek  <jakub@redhat.com>
883         * trans-intrinsic.c (gfc_conv_intrinsic_minmax): Use VAR_P (x)
884         instead of TREE_CODE (x) == VAR_DECL.
885         * trans-expr.c (gfc_class_vptr_get, gfc_class_len_get,
886         gfc_class_len_or_zero_get, gfc_get_vptr_from_expr,
887         gfc_conv_string_length, conv_base_obj_fcn_val,
888         gfc_conv_procedure_call, gfc_trans_assignment_1): Likewise.
889         * trans-openmp.c (gfc_omp_predetermined_sharing,
890         gfc_omp_disregard_value_expr, gfc_omp_private_debug_clause,
891         gfc_trans_omp_atomic, gfc_trans_omp_do): Likewise.
892         * trans-io.c (nml_get_addr_expr): Likewise.
893         * trans-decl.c (gfc_finish_decl, gfc_build_qualified_array,
894         gfc_get_symbol_decl, gfc_get_fake_result_decl,
895         gfc_trans_deferred_vars, gfc_trans_use_stmts,
896         generate_local_decl): Likewise.
897         * trans-array.c (trans_array_constructor, trans_array_bound_check,
898         build_class_array_ref, gfc_array_init_size,
899         gfc_trans_auto_array_allocation, gfc_trans_g77_array,
900         gfc_trans_dummy_array_bias, gfc_alloc_allocatable_for_assignment,
901         gfc_trans_deferred_array): Likewise.
902         * trans.c (gfc_build_array_ref): Likewise.  Use
903         VAR_OR_FUNCTION_DECL_P (x) instead of TREE_CODE (x) == VAR_DECL
904         || TREE_CODE (x) == FUNCTION_DECL.
906 2016-10-23  Steven G. Kargl  <kargl@gcc.gnu.org>
908         PR fortran/77763
909         * parse.c (parse_spec): Allow STRUCTURE in BLOCK DATA.  Sort
910         case labels.
912 2016-10-23  Steven G. Kargl  <kargl@gcc.gnu.org>
914         PR fortran/54730
915         PR fortran/78033
916         * array.c (gfc_match_array_constructor): Remove checkpointing
917         introduced in r196416 (original fix for PR fortran/54730).  Move
918         initialization to top of function.
919         * match.c (gfc_match_type_spec): Special case matching for REAL.
921 2016-10-23  Paul Thomas  <pault@gcc.gnu.org>
923         PR fortran/69834
924         * class.c (gfc_find_derived_vtab): Obtain the gsymbol for the
925         derived type's module. If the gsymbol is present and the top
926         level namespace corresponds to a module, use the gsymbol name
927         space. In the search to see if the vtable exists, try the gsym
928         namespace first.
929         * dump-parse-tree (show_code_node): Modify select case dump to
930         show select type construct.
931         * resolve.c (build_loc_call): New function.
932         (resolve_select_type): Add check for repeated type is cases.
933         Retain selector expression and use it later instead of expr1.
934         Exclude deferred length TYPE IS cases and emit error message.
935         Store the address for the vtable in the 'low' expression and
936         the hash value in the 'high' expression, for each case. Do not
937         call resolve_select.
938         * trans.c(trans_code) : Call gfc_trans_select_type.
939         * trans-stmt.c (gfc_trans_select_type_cases): New function.
940         (gfc_trans_select_type): New function.
941         * trans-stmt.h : Add prototype for gfc_trans_select_type.
943 2016-10-22  Thomas Koenig  <tkoenig@gcc.gnu.org>
945         PR fortran/78021
946         * gfc_compare_functions:  Strings with different lengths in
947         argument lists compare unequal.
949 2016-10-22  Andre Vehreschild  <vehre@gcc.gnu.org>
951         PR fortran/43366
952         PR fortran/51864
953         PR fortran/57117
954         PR fortran/61337
955         PR fortran/61376
956         * primary.c (gfc_expr_attr): For transformational functions on classes
957         get the attrs from the class argument.
958         * resolve.c (resolve_ordinary_assign): Remove error message due to
959         feature implementation.  Rewrite POINTER_ASSIGNS to ordinary ones when
960         the right-hand side is scalar class object (with some restrictions).
961         * trans-array.c (trans_array_constructor): Create the temporary from
962         class' inner type, i.e., the derived type.
963         (build_class_array_ref): Add support for class array's storage of the
964         class object or the array descriptor in the decl saved descriptor.
965         (gfc_conv_expr_descriptor): When creating temporaries for class objects
966         add the class object's handle into the decl saved descriptor.
967         (structure_alloc_comps): Use the common way to get the _data component.
968         (gfc_is_reallocatable_lhs): Add notion of allocatable class objects.
969         * trans-expr.c (gfc_find_and_cut_at_last_class_ref): Remove the only ref
970         only when the expression's type is BT_CLASS.
971         (gfc_trans_class_init_assign): Correctly handle class arrays.
972         (gfc_trans_class_assign): Joined into gfc_trans_assignment_1.
973         (gfc_conv_procedure_call): Support for class types as arguments.
974         (trans_get_upoly_len): For unlimited polymorphics retrieve the _len
975         component's tree.
976         (trans_class_vptr_len_assignment): Catch all ways to assign the _vptr
977         and _len components of a class object correctly.
978         (pointer_assignment_is_proc_pointer): Identify assignments of
979         procedure pointers.
980         (gfc_trans_pointer_assignment): Enhance support for class object pointer
981         assignments.
982         (gfc_trans_scalar_assign): Removed assert.
983         (trans_class_assignment): Assign to a class object.
984         (gfc_trans_assignment_1): Treat class objects correctly.
985         (gfc_trans_assignment): Propagate flags to trans_assignment_1.
986         * trans-stmt.c (gfc_trans_allocate): Use gfc_trans_assignment now
987         instead of copy_class_to_class.
988         * trans-stmt.h: Function prototype removed.
989         * trans.c (trans_code): Less special casing for class objects.
990         * trans.h: Added flags to gfc_trans_assignment () prototype.
992 2016-10-21  Paul Thomas  <pault@gcc.gnu.org>
994         PR fortran/69566
995         * resolve.c (fixup_array_ref): New function.
996         (resolve_select_type): Gather up the rank and array reference,
997         if any, from the selector. Fix up the 'associate name' and the
998         'associate entities' as necessary.
999         * trans-expr.c (gfc_conv_class_to_class): If the symbol backend
1000         decl is a FUNCTION_DECL, use the 'fake_result_decl' instead.
1002 2016-10-20  Steven G. Kargl  <kargl@gcc.gnu.org>
1004         * array.c (gfc_match_array_constructor): Remove set, but unused
1005         variable.
1007 2016-10-20  Andre Vehreschild  <vehre@gcc.gnu.org>
1009         * class.c (gfc_build_class_symbol): Set the kind of _len to
1010         gfc_charlen_int_kind to catch changes of the charlen kind.
1012 2016-10-17  Steven G. Kargl  <kargl@gcc.gnu.org>
1014         PR fortran/77978
1015         * match.c (gfc_match_stopcode): Fix error reporting for several
1016         deficiencies in matching stop-codes.
1018 2016-10-17  Paul Thomas  <pault@gcc.gnu.org>
1020         PR fortran/61420
1021         PR fortran/78013
1022         * resolve.c (resolve_variable): Obtain the typespec for a
1023         variable expression, when the variable is a function result
1024         that is a procedure pointer.
1026 2016-10-16  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1028         PR fortran/48298
1029         * trans-io.c (transfer_expr): Ignore dtio procedures for inquire
1030         with iolength.
1032 2016-10-15  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1034         PR fortran/77972
1035         * scanner.c (gfc_next_char_literal): If nextc is null do not
1036         decrement the pointer and call the diagnostics.
1038 2016-10-14  Andre Vehreschild  <vehre@gcc.gnu.org>
1040         * resolve.c (resolve_symbol): Add unimplemented message for
1041         polymorphic types with allocatable/pointer components and coarray=lib.
1043 2016-10-13  Thomas Preud'homme  <thomas.preudhomme@arm.com>
1045         * trans-intrinsic.c: Include memmodel.h.
1047 2016-10-13  Andre Vehreschild  <vehre@gcc.gnu.org>
1049         PR fortran/72832
1050         * trans-expr.c (gfc_copy_class_to_class): Add generation of
1051         runtime array bounds check.
1052         * trans-intrinsic.c (gfc_conv_intrinsic_size): Add a crutch to
1053         get the descriptor of a function returning a class object.
1054         * trans-stmt.c (gfc_trans_allocate): Use the array spec on the
1055         array to allocate instead of the array spec from source=.
1057 2016-10-12  Andre Vehreschild  <vehre@gcc.gnu.org>
1059         * trans-expr.c (gfc_find_and_cut_at_last_class_ref): Fixed style.
1060         (gfc_trans_class_init_assign): Same.
1061         (gfc_conv_procedure_call): Same.
1062         (gfc_trans_assignment_1): Same.
1063         * trans-stmt.c (gfc_trans_allocate): Same.
1065 2016-10-11  Jakub Jelinek  <jakub@redhat.com>
1067         * iresolve.c (is_trig_resolved, resolve_trig_call): Formatting fixes.
1068         * simplify.c (simplify_trig_call, degrees_f, radians_f,
1069         gfc_simplify_atrigd, gfc_simplify_cotan): Likewise.
1071 2016-10-11  Steven G. Kargl  <kargl@gcc.gnu.org>
1073         PR fortran/77942
1074         * simplify.c (gfc_simplify_cshift): Check for zero.
1076 2016-10-11  Fritz Reese  <fritzoreese@gmail.com>
1078         * iresolve.c (get_radians, get_degrees): Fix sloppy commit.
1079         * simplify.c (degrees_f, radians_f): Ditto.
1081 2016-10-11  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1083         * simplify.c (radians_f): Fix mpfr_mod.
1084         * ireolce.c (get_degrees): Declare tmp.
1086 2016-10-11  Fritz Reese  <fritzoreese@gmail.com>
1088         * lang.opt: New flag -fdec-math.
1089         * options.c (set_dec_flags): Enable with -fdec.
1090         * invoke.texi, gfortran.texi, intrinsic.texi: Update documentation.
1091         * intrinsics.c (add_functions, do_simplify): New intrinsics
1092         with -fdec-math.
1093         * gfortran.h (gfc_isym_id): New isym GFC_ISYM_COTAN.
1094         * gfortran.h (gfc_resolve_atan2d, gfc_resolve_cotan,
1095         gfc_resolve_trigd, gfc_resolve_atrigd): New prototypes.
1096         * iresolve.c (resolve_trig_call, get_degrees, get_radians,
1097         is_trig_resolved, gfc_resolve_cotan, gfc_resolve_trigd,
1098         gfc_resolve_atrigd, gfc_resolve_atan2d): New functions.
1099         * intrinsics.h (gfc_simplify_atan2d, gfc_simplify_atrigd,
1100         gfc_simplify_cotan, gfc_simplify_trigd): New prototypes.
1101         * simplify.c (simplify_trig_call, degrees_f, radians_f,
1102         gfc_simplify_cotan, gfc_simplify_trigd, gfc_simplify_atrigd,
1103         gfc_simplify_atan2d): New functions.
1105 2016-10-10  Thomas Koenig  <tkoenig@gcc.gnu.org>
1107         PR fortran/77915
1108         * frontend-passes.c (inline_matmul_assign):  Return early if
1109         inside a FORALL statement.
1111 2016-10-07  Fritz Reese  <fritzoreese@gmail.com>
1113         * interface.c (compare_components): Check charlen for BT_CHAR.
1115 2016-10-07  Steven G. Kargl  <kargl@gcc.gnu.org>
1117         PR fortran/77406
1118         * interface.c (gfc_compare_interfaces): Fix detection of ambiguous
1119         interface involving alternate return.
1120         (check_interface1): Improve error message and loci.
1122 2016-10-06  Louis Krupp  <louis.krupp@zoho.com>
1124         PR fortran/69955
1125         * trans-array.c (gfc_conv_expr_descriptor): Don't allocate
1126         components if it's not necessary.
1128 2016-10-05  Louis Krupp  <louis.krupp@zoho.com>
1130         PR fortran/57910
1131         * trans-expr.c (gfc_add_interface_mapping): Don't try to
1132         dereference call-by-value scalar argument.
1134 2016-10-05  Steven G. Kargl  <kargls@gcc.gnu.org>
1136         PR fortran/58991
1137         PR fortran/58992
1138         * resolve.c (resolve_assoc_var):  Fix CHARACTER type-spec for a
1139         selector in ASSOCIATE.
1140         (resolve_fl_variable): Skip checks for an ASSOCIATE variable.
1142 2016-10-05  Fritz Reese  <fritzoreese@gmail.com>
1144         * interface.c (gfc_compare_types): Don't compare BT_UNION components
1145         until we know they're both UNIONs.
1146         * interface.c (gfc_compare_union_types): Guard against empty
1147         components.
1149 2016-10-05  Louis Krupp  <louis.krupp@zoho.com>
1151         PR fortran/67524
1152         * resolve.c (resolve_symbol): Don't apply default type rules to
1153         mixed-entry master created for function entry points.
1155 2016-09-30  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1157         PR fortran/66643
1158         * io.c (match_dt_unit): Peek check for missing format.
1160 2016-09-30  Fritz Reese  <fritzoreese@gmail.com>
1162         PR fortran/77764
1163         * interface.c (gfc_compare_union_types): Null-guard map components.
1165 2016-09-30  Fritz Reese  <fritzoreese@gmail.com>
1167         PR fortran/77782
1168         * interface.c (gfc_compare_derived_types): Use gfc_compare_union_types
1169         to compare union types.
1171 2016-09-30  Andre Vehreschild  <vehre@gcc.gnu.org>
1173         * trans-array.c (gfc_array_allocate): Use the token from coarray's
1174         .token member.
1175         * trans-intrinsic.c (conv_expr_ref_to_caf_ref): Only generate
1176         caf-reference chains from the first coarray references on.
1177         * trans-types.c (gfc_get_derived_type): Switch on mandatory .token
1178         member generation for allocatable arrays in coarrays in derived types.
1180 2016-09-29  James Greenhalgh  <james.greenhalgh@arm.com>
1182         * options.c (gfc_post_options): Remove special case for
1183         TARGET_FLT_EVAL_METHOD_NON_DEFAULT with -fexcess-precision=standard.
1185 2016-09-27  Jakub Jelinek  <jakub@redhat.com>
1187         * dependency.c (gfc_dep_compare_expr): Remove break after return.
1188         * frontend-passes.c (optimize_op): Likewise.
1189         * interface.c (gfc_current_interface_head): Likewise.
1190         * symbol.c (check_conflict): Likewise.
1191         * trans-intrinsic.c (build_fix_expr): Likewise.
1193         PR fortran/77666
1194         * trans-openmp.c (gfc_omp_private_outer_ref): Return true even for
1195         references to allocatable arrays.
1197 2016-09-26  Steven G. Kargl  <kargl@gcc.gnu.org>
1199         PR fortran/77420
1200         * trans-common.c:  Handle array elements in equivalence when
1201         the lower and upper bounds of array spec are NULL.
1203 2016-09-26  Paul Thomas  <pault@gcc.gnu.org>
1205         PR fortran/48298
1206         * interface.c (gfc_find_specific_dtio_proc) : Return NULL if
1207         the derived type is broken, as indicated by a flavor other than
1208         FL_DERIVED.
1210 2016-09-26  Marek Polacek  <polacek@redhat.com>
1212         PR c/7652
1213         * arith.c (eval_intrinsic): Add gcc_fallthrough.
1214         * frontend-passes.c (optimize_op): Likewise.
1215         (gfc_expr_walker): Likewise.
1216         * parse.c (next_fixed): Likewise.
1217         * primary.c (match_variable): Likewise.
1218         * trans-array.c: Likewise.
1219         * trans-expr.c (flatten_array_ctors_without_strlen): Likewise.
1220         * trans-io.c (transfer_expr): Likewise.
1222 2016-09-25  Steven G. Kargl  <kargl@gcc.gnu.org>
1224         PR fortran/77429
1225         * dependency.c (gfc_check_dependency):  Convert gcc_assert() to
1226         a conditional and possible call to  gfc_internal_error().
1228 2016-09-25  Steven G. Kargl  <kargl@gcc.gnu.org>
1230         PR fortran/77694
1231         * frontend-passes.c (optimize_binop_array_assignment): Check pointer
1232         for NULL.
1234 2016-09-23  Fritz Reese  <fritzoreese@gmail.com>
1236         * lang.opt, invoke.texi, gfortran.texi: New flag -fdec-static.
1237         * options.c (set_dec_flags): Set -fdec-static with -fdec.
1238         * gfortran.h (symbol_attribute): New attribute automatic.
1239         * gfortran.h (gfc_add_automatic): New prototype.
1240         * match.h (gfc_match_automatic, gfc_match_static): New functions.
1241         * decl.c (gfc_match_automatic, gfc_match_static): Ditto.
1242         * symbol.c (gfc_add_automatic): Ditto.
1243         * decl.c (match_attr_spec): Match AUTOMATIC and STATIC decls.
1244         * parse.c (decode_specification_statement, decode_statement): Ditto.
1245         * resolve.c (apply_default_init_local, resolve_fl_variable_derived,
1246         resolve_symbol): Support for automatic attribute.
1247         * symbol.c (check_conflict, gfc_copy_attr, gfc_is_var_automatic):
1248         Ditto.
1249         * trans-decl.c (gfc_finish_var_decl): Ditto.
1251 2016-09-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1253         PR fortran/48298
1254         * gfortran.h (gfc_dt): Add *udtio.
1255         * ioparm.def: Add bit IOPARM_dt_f2003 to align with library use of bit
1256         25. Add IOPARM_dt_dtio bit to common flags.
1257         * resolve.c (resolve_transfer): Set dt->udtio to expression.
1258         * io.c (gfc_match_inquire): Adjust error message for internal
1259         unit KIND.
1260         * libgfortran.h: Adjust defines for GFC_INTERNAL_UNIT4,
1261         GFC_INTERNAL_UNIT, and GFC_INVALID_UNIT.
1262         * trans-io.c (build_dt): Set common_unit to reflect the KIND of
1263         the internal unit. Set mask bit for presence of dt->udtio.
1265 2016-09-22  Andre Vehreschild  <vehre@gcc.gnu.org>
1267         * trans-intrinsic.c (gfc_conv_intrinsic_caf_get): Use the old caf-
1268         interface where possible.
1270 2016-09-22  Paul Thomas  <pault@gcc.gnu.org>
1272         * interface.c (check_dtio_interface1): Introduce errors for
1273         alternate returns and incorrect numbers of arguments.
1274         (gfc_find_specific_dtio_proc): Return cleanly if the derived
1275         type either doesn't exist or has no namespace.
1277 2016-09-21  Louis Krupp  <louis.krupp@zoho.com>
1279         PR fortran/66107
1280         * decl.c (add_init_expr_to_sym): Catch variable character length
1281         in parameter array.
1283 2016-09-21  Paul Thomas  <pault@gcc.gnu.org>
1285         PR fortran/77657
1287         * interface.c (gfc_find_specific_dtio_proc): Borrow trick from
1288         resolve_typebound_generic_call to find dtio procedures that
1289         over-ride those in the declared type.
1291 2016-09-20  Marek Polacek  <polacek@redhat.com>
1293         * trans-intrinsic.c (conv_expr_ref_to_caf_ref): Adjust fall through
1294         comment.
1296 2016-09-19  Andre Vehreschild  <vehre@gcc.gnu.org>
1298         PR fortran/71952
1299         * expr.c (gfc_check_assign): Added flag to control whether datatype
1300         conversion is allowed.
1301         * gfortran.h: Added caf-token-tree to gfc_component.  Changed
1302         prototypes mostly to add whether datatype conversion is allowed.
1303         * gfortran.texi: Added documentation for the caf_reference_t and the
1304         caf_*_by_ref function.
1305         * primary.c (caf_variable_attr): Similar to gfc_variable_attr but
1306         focused on the needs of coarrays.
1307         (gfc_caf_attr): Same.
1308         * resolve.c (resolve_ordinary_assign): Set the conversion allowed
1309         flag when not in a coarray.
1310         * trans-array.c (gfc_array_init_size): Moved setting of array
1311         descriptor's datatype before the alloc, because caf_register needs it.
1312         (gfc_array_allocate): Changed notion of whether an array is a coarray.
1313         (gfc_array_deallocate): Same.
1314         (gfc_alloc_allocatable_for_assignment): Added setting of coarray's
1315         array descriptor datatype before the register.  And using deregister/
1316         register to mimmick a realloc for coarrays.
1317         * trans-decl.c (gfc_build_builtin_function_decls): Corrected signatures
1318         of old caf-functions and added signature definitions of the _by_ref
1319         ones.
1320         (generate_coarray_sym_init): Adapted to new caf_register signature.
1321         * trans-expr.c (gfc_conv_scalar_to_descriptor): Make sure a constant
1322         is translated to an lvalue expression before use in an array
1323         descriptor.
1324         (gfc_get_ultimate_alloc_ptr_comps_caf_token): New function.  Get the
1325         last allocatable component's coarray token.
1326         (gfc_get_tree_for_caf_expr): For top-level object get the coarray
1327         token and check for unsupported features.
1328         (gfc_get_caf_token_offset): Getting the offset might procude new
1329         statements, which now are stored in the pre and post of the current se.
1330         (gfc_caf_get_image_index): For this image return a call to
1331         caf_this_image.
1332         (expr_may_alias_variables): Check that the result is set for testing
1333         its properties.
1334         (alloc_scalar_allocatable_for_assignment): Added auto allocation of
1335         coarray components.
1336         (gfc_trans_assignment_1): Rewrite an assign to a coarray object to
1337         be a sendget.
1338         * trans-intrinsic.c (conv_caf_vector_subscript_elem): Corrected
1339         wrong comment.
1340         (compute_component_offset): Compute the correct offset a structure
1341         member.
1342         (conv_expr_ref_to_caf_ref): Convert to a chain of refs into
1343         caf_references.
1344         (gfc_conv_intrinsic_caf_get): Call caf_get_by_ref instead of caf_get.
1345         (conv_caf_send): Call caf_*_by_ref for coarrays that need
1346         reallocation.
1347         (gfc_conv_intrinsic_function): Adapted to new signuature of the caf
1348         drivers.
1349         (conv_intrinsic_atomic_op): Add pre and post statements correctly.
1350         (conv_intrinsic_atomic_ref): Same.
1351         (conv_intrinsic_atomic_cas): Same.
1352         (conv_intrinsic_event_query): Same.
1353         * trans-stmt.c (gfc_trans_lock_unlock): Same.
1354         (gfc_trans_event_post_wait): Same.
1355         (gfc_trans_allocate): Support allocation of allocatable coarrays.
1356         (gfc_trans_deallocate): And there deallocation.
1357         * trans-types.c (gfc_typenode_for_spec): Added flag to control whether
1358         a component is part of coarray.  When so, then add space to store a
1359         coarray token.
1360         (gfc_build_array_type): Same.
1361         (gfc_get_array_descriptor_base): Same.
1362         (gfc_get_array_type_bounds): Same.
1363         (gfc_sym_type): Same.
1364         (gfc_get_derived_type): Same.
1365         (gfc_get_caf_reference_type): Declare the caf_reference_type.
1366         * trans-types.h: Prototype changes only.
1367         * trans.c (gfc_allocate_using_lib): Use the updated caf_register
1368         signature.
1369         (gfc_allocate_allocatable): Same.
1370         (gfc_deallocate_with_status): Same.
1371         * trans.h: Defined the runtime types for caf_reference_t and the enums.
1373 2016-09-19  Fritz Reese  <fritzoreese@gmail.com>
1375         PR fortran/77584
1376         * decl.c (match_record_decl, gfc_match_decl_type_spec): Fixes to
1377         handling of structure/record from declaration-type-spec.
1379 2016_09_17  Louis Krupp  <louis.krupp@zoho.com>
1381         PR fortran/68078
1382         * resolve.c (resolve_allocate_expr): Check that derived type
1383         pointer, object or array has been successfully allocated before
1384         initializing.
1386 2016-09-16  Steven G. Kargl  <kargl@gcc.gnu.org>
1388         PR fortran/77612
1389         * decl.c (char_len_param_value): Check parent namespace for
1390         seen_implicit_none.
1392 2016-09-15  Louis Krupp  <louis.krupp@zoho.com>
1394         PR fortran/69963
1395         * parse.c (reject_statement): Clear charlen pointers in implicit
1396         character typespecs before those charlen structures are freed.
1398 2016-09-14  Bernd Edlinger  <bernd.edlinger@hotmail.de>
1400         * simplify.c (gfc_simplify_repeat): Fix a misplaced closing ')'.
1402 2016-09-13  Steven G. Kargl  <kargl@gcc.gnu.org>
1404         PR fortran/77420
1405         * module.c (load_equiv):  Revert revision 240063.
1407 2016-09-10  Paul Thomas  <pault@gcc.gnu.org>
1408             Steven G. Kargl  <kargl@gcc.gnu.org>
1410         PR fortran/77532
1411         * interface.c (check_dtio_arg_TKR_intent): Return after error.
1412         (check_dtio_interface1): Remove asserts, test for NULL and return
1413         if found.
1415 2016-09-09  Steven G. Kargl  <kargl@gcc.gnu.org>
1417         PR fortran/77420
1418         * module.c (load_equiv): If the current namespace has a list of
1419         equivalence statements, initialize duplicate to false and then
1420         look for duplicates; otherwise, initialize it to true.
1422 2016-09-09  Steven G. Kargl  <kargl@gcc.gnu.org>
1424         PR fortran/77506
1425         * array.c (gfc_match_array_constructor): CHARACTER(len=*) cannot
1426         appear in an array constructor.
1428 2016-09-09  Steven G. Kargl  <kargl@gcc.gnu.org>
1430         PR fortran/77507
1431         * intrinsic.c (add_functions):  Use correct keyword.
1433 2016-09-08  Steven G. Kargl  <kargl@gcc.gnu.org>
1435         PR fortran/69514
1436         * array.c (gfc_match_array_constructor):  If type-spec is present,
1437         walk the array constructor performing possible conversions for
1438         numeric types.
1440 2016-09-08  Jakub Jelinek  <jakub@redhat.com>
1442         PR fortran/77500
1443         * trans-openmp.c (gfc_trans_omp_atomic): For atomic write or
1444         swap, don't try to look through GFC_ISYM_CONVERSION.  In other cases,
1445         check that value.function.isym is non-NULL before dereferencing it.
1447 2016-09-04  Steven G. Kargl  <kargl@gcc.gnu.org>
1449         PR fortran/77391
1450         * resolve.c (deferred_requirements): New function to check F2008:C402.
1451         (resolve_fl_variable,resolve_fl_parameter): Use it.
1453 2016-09-04  Steven G. Kargl  <kargl@gcc.gnu.org>
1455         PR fortran/77460
1456         * simplify.c (simplify_transformation_to_scalar):  On error, result
1457         may be NULL, simply return.
1459 2016-08-31  Jakub Jelinek  <jakub@redhat.com>
1461         PR fortran/77352
1462         * trans-openmp.c (gfc_trans_omp_parallel_workshare): Always add a
1463         BIND_EXPR with BLOCK around what gfc_trans_omp_workshare returns.
1465         PR fortran/77374
1466         * parse.c (parse_omp_oacc_atomic): Copy over cp->ext.omp_atomic
1467         to cp->block->ext.omp_atomic.
1468         * resolve.c (gfc_resolve_blocks): Assert block with one or two
1469         EXEC_ASSIGNs for EXEC_*_ATOMIC.
1470         * openmp.c (resolve_omp_atomic): Don't assert one or two
1471         EXEC_ASSIGNs, instead return quietly for EXEC_NOPs and otherwise
1472         error unexpected statements.
1474 2016-08-31  Paul Thomas  <pault@gcc.gnu.org>
1475             Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1477         PR fortran/48298
1478         * decl.c (access_attr_decl): Include case INTERFACE_DTIO as
1479         appropriate.
1480         * gfortran.h : Add INTRINSIC_FORMATTED and
1481         INTRINSIC_UNFORMATTED to gfc_intrinsic_op. Add INTERFACE_DTIO
1482         to interface type. Add new enum 'dtio_codes'. Add bitfield
1483         'has_dtio_procs' to symbol_attr. Add prototypes
1484         'gfc_check_dtio_interfaces' and 'gfc_find_specific_dtio_proc'.
1485         * interface.c (dtio_op): New function.
1486         (gfc_match_generic_spec): Match generic DTIO interfaces.
1487         (gfc_match_interface): Treat DTIO interfaces in the same way as
1488         (gfc_current_interface_head): Add INTERFACE_DTIO appropriately.
1489         (check_dtio_arg_TKR_intent): New function.
1490         (check_dtio_interface1): New function.
1491         (gfc_check_dtio_interfaces): New function.
1492         (gfc_find_specific_dtio_proc): New function.
1493         * io.c : Add FMT_DT to format_token.
1494         (format_lex): Handle DTIO formatting.
1495         * match.c (gfc_op2string): Add DTIO operators.
1496         * resolve.c (derived_inaccessible): Ignore pointer components
1497         to enclosing derived type.
1498         (resolve_transfer): Resolve transfers that involve DTIO.
1499         procedures. Find the specific subroutine for the transfer and
1500         use its existence to over-ride some of the constraints on
1501         derived types. If the transfer is recursive, require that the
1502         subroutine be so qualified.
1503         (dtio_procs_present): New function.
1504         (resolve_fl_namelist): Remove inhibition of polymorphic objects
1505         in namelists if DTIO read and write subroutines exist. Likewise
1506         for derived types.
1507         (resolve_types): Invoke 'gfc_verify_dtio_procedures'.
1508         * symbol.c : Set 'dtio_procs' using 'minit'.
1509         * trans-decl.c (gfc_finish_var_decl): If a derived-type/class
1510         object is associated with DTIO procedures, make it TREE_STATIC.
1511         * trans-expr.c (gfc_get_vptr_from_expr): If the expression
1512         drills down to a PARM_DECL, extract the vptr correctly.
1513         (gfc_conv_derived_to_class): Check 'info' in the test for
1514         'useflags'. If the se expression exists and is a pointer, use
1515         it as the class _data.
1516         * trans-io.c : Add IOCALL_X_DERIVED to iocall and the function
1517         prototype. Likewise for IOCALL_SET_NML_DTIO_VAL.
1518         (set_parameter_tree): Renamed from 'set_parameter_const', now
1519         returns void and has new tree argument. Calls modified to match
1520         new interface.
1521         (transfer_namelist_element): Transfer DTIO procedure pointer
1522         and vpointer using the new function IOCALL_SET_NML_DTIO_VAL.
1523         (get_dtio_proc): New function.
1524         (transfer_expr): Add new argument for the vptr field of class
1525         objects. Add the code to call the specific DTIO proc, convert
1526         derived types to class and call IOCALL_X_DERIVED.
1527         (trans_transfer): Add BT_CLASS to structures for treatment by
1528         the scalarizer. Obtain the vptr for the dynamic type, both for
1529         scalar and array transfer.
1531 2016-08-30  Fritz Reese  <fritzoreese@gmail.com>
1533         * gfortran.texi: Fix typo in STRUCTURE documentation.
1535 2016-08-29  Fritz Reese  <fritzoreese@gmail.com>
1537         Fix, reorganize, and clarify comparisons of anonymous types/components.
1539         PR fortran/77327
1540         * interface.c (is_anonymous_component, is_anonymous_dt): New functions.
1541         * interface.c (compare_components, gfc_compare_derived_types): Use new
1542         functions.
1544 2016-08-27  Steven G. Kargl  <kargl@gcc.gnu.org>
1546         PR fortran/77380
1547         * dependency.c (gfc_check_dependency): Do not assert with
1548         -fcoarray=lib.
1550 2016-08-27  Steven G. Kargl  <kargl@gcc.gnu.org>
1552         PR fortran/77372
1553         simplify.c (simplify_ieee_selected_real_kind): Check for NULL pointers.
1555 2016-08-25  Steven g. Kargl  <kargl@gcc.gnu.org>
1557         PR fortran/77351
1558         * frontend-passes.c (remove_trim,combine_array_constructor): Check for
1559         NULL pointer.
1561 2016-08-24  Paul Thomas  <pault@gcc.gnu.org>
1563         PR fortran/77358
1564         * resolve.c (resolve_fl_procedure): Use the correct gfc_charlen
1565         for deferred character length module procedures.
1567 2016-08-23  Fritz Reese  <fritzoreese@gmail.com>
1569         * decl.c (gfc_match_structure_decl): Make gfc_structure_id static.
1571 2016-08-23  Fritz Reese  <fritzoreese@gmail.com>
1573         * interface.c (compare_components): Fix typo in name check conditional.
1575 2016-08-22  Steven G. Kargl  <kargl@gcc.gnu.org>
1576             Bud Davis  <jmdavis@link.com>
1578         PR fortran/60774
1579         * parse.c (next_free,next_fixed): Issue error for statement label
1580         without a statement.
1582 2016-08-22  Steven G. Kargl  <kargl@gcc.gnu.org>
1584         PR fortran/61318
1585         * interface.c (compare_parameter): Use better locus for error message.
1587 2016-08-22  Steven G. Kargl  <kargl@gcc.gnu.org>
1589         PR fortran/77260
1590         * gcc/fortran/trans-decl.c (generate_local_decl): Suppress warning
1591         for unused variable if symbol is entry point.
1593 2016-08-19  Joseph Myers  <joseph@codesourcery.com>
1595         PR c/32187
1596         * trans-types.h (float128_type_node): Rename to
1597         gfc_float128_type_node.
1598         (complex_float128_type_node): Rename to
1599         gfc_complex_float128_type_node.
1600         * iso-c-binding.def, trans-intrinsic.c, trans-types.c: All users
1601         changed.
1603 2016-08-19  Jakub Jelinek  <jakub@redhat.com>
1605         PR fortran/71014
1606         * resolve.c (gfc_resolve): For ns->construct_entities don't save, clear
1607         and restore omp state around the resolving.
1609         PR fortran/69281
1610         * trans-openmp.c (gfc_trans_omp_parallel, gfc_trans_omp_task,
1611         gfc_trans_omp_target): Wrap gfc_trans_omp_code result in an extra
1612         BIND_EXPR with its own forced BLOCK.
1614 2016-08-19  Janne Blomqvist  <jb@gcc.gnu.org>
1616         * intrinsics.texi (RANDOM_NUMBER): Remove reference to
1617         init_random_seed in example.
1618         (RANDOM_SEED): Remove warning to not set all seed values to 0.
1620 2016-08-18  David Malcolm  <dmalcolm@redhat.com>
1622         * error.c (gfc_diagnostic_starter): Update for change to
1623         diagnostic_show_locus.
1625 2016-08-17  Jakub Jelinek  <jakub@redhat.com>
1627         PR fortran/67496
1628         * trans-array.c (trans_array_constructor): Load
1629         expr->ts.u.cl->length_from_typespec only if expr->ts.type is
1630         BT_CHARACTER.
1632 2016-08-15  Fritz Reese  <fritzoreese@gmail.com>
1634         * lang.opt, invoke.texi: New flag -finit-derived.
1635         * gfortran.h (gfc_build_default_init_expr, gfc_apply_init,
1636         gfc_generate_initializer): New prototypes.
1637         * expr.c (gfc_build_default_init_expr, gfc_apply_init,
1638         component_initializer, gfc_generate_initializer): New functions.
1639         * expr.c (gfc_default_initializer): Wrap gfc_generate_initializer.
1640         * decl.c (build_struct): Move common code to gfc_apply_init.
1641         * resolve.c (can_generate_init): New function.
1642         * resolve.c (build_default_init_expr): Wrap gfc_build_default_init_expr.
1643         * resolve.c (apply_default_init, resolve_fl_variable_derived): Use
1644         gfc_generate_initializer.
1645         * trans-decl.c (gfc_generate_function_code): Use
1646         gfc_generate_initializer.
1648 2016-08-15  Thomas Koenig  <tkoenig@gcc.gnu.org>
1650         * frontend-passes.c (create_var):  Set ts.deferred for
1651         deferred-length character variables.
1652         * dump-parse-tree.c (show_typespec):  Also dump
1653         is_c_interop, is_iso_c and deferred flags.
1655 2016-08-15  Jakub Jelinek  <jakub@redhat.com>
1657         PR debug/71906
1658         * trans-decl.c (gfc_get_symbol_decl): Call gfc_finish_var_decl
1659         for decl's character length before gfc_finish_var_decl on the
1660         decl itself.
1662 2016-08-14  Chung-Lin Tang  <cltang@codesourcery.com>
1664         PR fortran/70598
1665         * openmp.c (resolve_omp_clauses): Adjust use_device clause
1666         handling to only allow pointers and arrays.
1668 2016-08-12  Marek Polacek  <polacek@redhat.com>
1670         PR c/7652
1671         * decl.c (match_attr_spec): Add FALLTHRU.
1672         * primary.c (match_arg_list_function): Likewise.
1673         * resolve.c (resolve_operator): Adjust fall through comment.
1674         (fixup_charlen): Add FALLTHRU.
1675         (resolve_allocate_expr): Adjust fall through comment.
1676         * trans-array.c (gfc_conv_ss_startstride): Add FALLTHRU.
1677         * trans-intrinsic.c (gfc_conv_intrinsic_len): Adjust fall through
1678         comment.
1680 2016-08-11  Janne Blomqvist  <jb@gcc.gnu.org>
1682         * check.c (gfc_check_random_seed): Use new seed size in check.
1683         * intrinsic.texi (RANDOM_NUMBER): Updated documentation.
1684         (RANDOM_SEED): Likewise.
1686 2016-08-08  Jakub Jelinek  <jakub@redhat.com>
1688         PR fortran/72716
1689         * openmp.c (gfc_match_omp_declare_simd): Don't stick anything into
1690         BLOCK DATA ns, it will be rejected later.
1692 2016-08-08  Andre Vehreschild  <vehre@gcc.gnu.org>
1694         PR fortran/71936
1695         * trans-array.c (gfc_array_allocate): When SOURCE= is a function
1696         stick with the ref of the object to allocate.
1698 2016-08-08  Andre Vehreschild  <vehre@gcc.gnu.org>
1700         PR fortran/72698
1701         * trans-stmt.c (gfc_trans_allocate): Prevent generating code for
1702         copy of zero sized string and with it an ICE.
1704 2016-08-08  Andre Vehreschild  <vehre@gcc.gnu.org>
1706         PR fortran/70524
1707         * trans-array.c (gfc_trans_dummy_array_bias): Ensure that the
1708         location information is correctly set.
1709         * trans-decl.c (gfc_trans_deferred_vars): Set the locus of the
1710         current construct early.
1712 2016-08-03  Fritz Reese  <fritzoreese@gmail.com>
1714         * lang.opt: New option -fdec-intrinsic-ints.
1715         * options.c (set_dec_flags): Enable with -fdec.
1716         * gfortran.texi, invoke.texi, intrinsics.texi: Update documentation.
1717         * intrinsic.c (add_function, add_subroutine): New B/I/J/K intrinsic
1718         variants.
1720 2016-07-30  Steven G. Kargl  <kargl@gcc.gnu.org>
1722         PR fortran/41922
1723         * target-memory.c (expr_to_char): Pass in locus and use it in error
1724         messages.
1725         (gfc_merge_initializers): Ditto.
1726         * target-memory.h: Update prototype for gfc_merge_initializers ().
1727         * trans-common.c (get_init_field): Use the correct locus.
1729 2016-07-30  Steven G. Kargl  <kargl@gcc.gnu.org>
1731         PR fortran/68566
1732         * check.c (gfc_check_reshape): Check for constant expression.
1734 2016-07-30  Steven G. Kargl  <kargl@gcc.gnu.org>
1736         PR fortran/69867
1737         * decl.c (build_struct): Ensure that pointers point to something.
1739 2016-07-30  Steven G. Kargl  <kargl@gcc.gnu.org>
1741         PR fortran/69962
1742         * decl.c (gfc_set_constant_character_len):  if expr is not
1743         constant issue an error instead of an ICE.
1745 2016-07-30  Steven G. Kargl  <kargl@gcc.gnu.org>
1747         PR fortran/70006
1748         * io.c (gfc_resolve_dt): Use correct locus.
1749         * resolve.c (resolve_branch): Ditto.
1751 2016-07-30  Steven G. Kargl  <kargl@gcc.gnu.org>
1753         PR fortran/71730
1754         * decl.c (char_len_param_value): Check return value of
1755         gfc_reduce_init_expr().
1757 2016-07-29  Dominik Vogt  <vogt@linux.vnet.ibm.com>
1759         * trans-array.c (gfc_conv_array_ref): Fix allocation of diagnostic
1760         message (was too small).
1762 2016-07-28  Steven G. Kargl  <kargl@gcc.gnu.org>
1764         PR fortran/71067
1765         * decl.c (match_data_constant): On error, set 'result' to NULL.
1767 2016-07-28  Steven G. Kargl  <kargl@gcc.gnu.org>
1769         PR fortran/71799
1770         * resolve.c(gfc_resolve_iterator): Failure of type conversion need
1771         not ICE.
1773 2016-07-28  Steven G. Kargl  <kargl@gcc.gnu.org>
1775         PR fortran/71859
1776         * check.c(numeric_check): Prevent ICE.  Issue error for invalid
1777         subroutine as an actual argument when numeric argument is expected.
1779 2016-07-28  Steven G. Kargl  <kargl@gcc.gnu.org>
1780             Thomas Koenig  <tkoenig@gcc.gnu.org>
1782         PR fortran/71883
1783         * frontend-passes.c (gfc_run_passes): Bail out if there are any
1784         errors.
1785         * error.c (gfc_internal_error): If there are any errors in the
1786         buffer, exit with EXIT_FAILURE.
1788 2016-07-28  Renlin Li  <renlin.li@arm.com>
1790         Revert
1791         2016-07-19  Thomas Koenig  <tkoenig@gcc.gnu.org>
1793         PR fortran/71902
1794         * dependency.c (gfc_check_dependency): Use dep_ref.  Handle case
1795         if identical is true and two array element references differ.
1796         (gfc_dep_resovler):  Move most of the code to dep_ref.
1797         (dep_ref):  New function.
1798         * frontend-passes.c (realloc_string_callback):  Name temporary
1799         variable "realloc_string".
1801 2016-07-26  Steven G. Kargl  <kargl@gcc.gnu.org>
1803         PR fortran/71862
1804         * class.c: Remove assert.  Iterate over component only if non-null.
1806 2016-07-22  Steven G. Kargl  <kargl@gcc.gnu.org>
1808         PR fortran/71935
1809         * check.c (is_c_interoperable): Simplify right expression.
1811 2016-07-22  Thomas Koenig  <tkoenig@gcc.gnu.org>
1813         PR fortran/71795
1814         * frontend-passes.c (combine_array_constructor):  Don't
1815         do anything if the expression is inside an array iterator.
1817 2016-07-22  Andre Vehreschild  <vehre@gcc.gnu.org>
1819         * expr.c (gfc_find_stat_co): Fixed whitespaces.
1820         * gfortran.texi: Fixed typos and reversed meaning of caf_get()'s
1821         src and dst description.
1822         * trans-decl.c (gfc_build_builtin_function_decls): Fixed style
1823         and corrected fnspec for caf functions.
1824         * trans-intrinsic.c (gfc_conv_intrinsic_caf_get): Fixed style.
1825         (conv_caf_send): Dito.
1827 2016-07-19  Thomas Koenig  <tkoenig@gcc.gnu.org>
1829         PR fortran/71902
1830         * dependency.c (gfc_check_dependency): Use dep_ref.  Handle case
1831         if identical is true and two array element references differ.
1832         (gfc_dep_resovler):  Move most of the code to dep_ref.
1833         (dep_ref):  New function.
1834         * frontend-passes.c (realloc_string_callback):  Name temporary
1835         variable "realloc_string".
1837 2016-07-17  Fritz Reese  <fritzoreese@gmail.com>
1839         PR fortran/71523
1840         * trans-decl.c (gfc_finish_var_decl): Replace automatic initializer with
1841         a static one.
1843 2016-07-15  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1844             Marco Restelli  <mrestelli@gmail.com>
1846         PR fortran/62125
1847         * symbol.c (select_type_insert_tmp): Recursively call self to take care
1848         of nested select type.
1850 2016-07-15  Cesar Philippidis  <cesar@codesourcery.com>
1852         * openmp.c (gfc_match_omp_clauses): Scan for clause vector_length
1853         before vector.
1855 2016-07-15  Andre Vehreschild  <vehre@gcc.gnu.org>
1857         PR fortran/71807
1858         * trans-expr.c (gfc_trans_subcomponent_assign): Special casing
1859         when allocatable component is set to null() in initializer.
1861 2016-07-14  Steven G. Kargl  <kargl@gcc.gnu.org>
1863         PR fortran/29819
1864         * parse.c (parse_contained): Use proper locus.
1866 2016-07-14  Andre Vehreschild  <vehre@gcc.gnu.org>
1868         PR fortran/70842
1869         * simplify.c (gfc_simplify_len): Only for unlimited polymorphic
1870         types replace the expression's _data ref with a _len ref.
1872 2016-07-09  Thomas Koenig  <tkoenig@gcc.gnu.org>
1874         PR fortran/71783
1875         * frontend-passes.c (create_var):  Always allocate a charlen
1876         for character variables.
1878 2016-07-08  Steven G. Kargl  <kargl@gcc.gnu.org>
1880         PR fortran/68426
1881         * simplify (gfc_simplify_spread): Adjust locus.
1883 2016-07-08  Cesar Philippidis  <cesar@codesourcery.com>
1885         * parse.c (matcha): Define.
1886         (decode_oacc_directive): Add spec_only local var and set it.  Use
1887         matcha to parse acc directives except for routine and declare.  Return
1888         ST_GET_FCN_CHARACTERISTICS if a non-declarative directive could be
1889         matched.
1891 2016-07-08  Martin Liska  <mliska@suse.cz>
1893         * invoke.texi (Wundefined-do-loop): Enhance documentation.
1895 2016-07-07  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1897         PR fortran/71764
1898         * trans-expr.c (gfc_trans_structure_assign): Remove assert.
1900 2016-07-07  Martin Liska  <mliska@suse.cz>
1902         * lang.opt (Wundefined-do-loop): New option.
1903         * resolve.c (gfc_resolve_iterator): Warn for Wundefined-do-loop.
1904         (gfc_trans_simple_do): Generate a c-style loop.
1905         (gfc_trans_do): Fix GNU coding style.
1906         * invoke.texi: Mention the new warning.
1908 2016-07-07  Martin Liska  <mliska@suse.cz>
1910         * trans-stmt.c (gfc_trans_do): Add expect builtin for DO
1911         loops with step bigger than +-1.
1913 2016-07-05  Alessandro Fanfarillo  <fanfarillo.gcc@gmail.com>
1915         * array.c (gfc_match_array_ref): Add parsing support for
1916         STAT= attribute in CAF reference.
1917         * expr.c (gfc_find_stat_co): New function that returns
1918         the STAT= assignment.
1919         * gfortran.h (gfc_array_ref): New member.
1920         * trans-decl.c (gfc_build_builtin_function_decls):
1921         new attribute for caf_get and caf_send functions.
1922         * trans-intrinsic.c (gfc_conv_intrinsic_caf_get): Passing
1923         the stat attribute to external function.
1924         (gfc_conv_intrinsic_caf_send): Ditto.
1926 2016-07-05  Andre Vehreschild  <vehre@gcc.gnu.org>
1928         PR fortran/71623
1929         * trans-stmt.c (gfc_trans_allocate): Add code of pre block of typespec
1930         in allocate to parent block.
1932 2016-07-04  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1934         PR fortran/66575
1935         * decl.c (match_procedure_interface): Exit loop if procedure
1936         interface refers to itself.
1938 2016-07-04  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1939             Steven G. Kargl  <kargl@gcc.gnu.org>
1941         PR fortran/35849
1942         * simplify.c (gfc_simplify_ishftc): Check that absolute value of
1943         SHIFT is less than or equal to SIZE.
1945 2016-07-01  Jakub Jelinek  <jakub@redhat.com>
1947         PR fortran/71687
1948         * f95-lang.c (struct binding_level): Add reversed field.
1949         (clear_binding_level): Adjust initializer.
1950         (getdecls): If reversed is clear, set it and nreverse the names
1951         chain before returning it.
1952         (poplevel): Use getdecls.
1953         * trans-decl.c (gfc_generate_function_code, gfc_process_block_locals):
1954         Use nreverse to pushdecl decls in the declaration order.
1956         PR fortran/71717
1957         * trans-openmp.c (gfc_omp_privatize_by_reference): Return false
1958         for GFC_DECL_ASSOCIATE_VAR_P with POINTER_TYPE.
1960 2016-06-30  Jakub Jelinek  <jakub@redhat.com>
1962         PR fortran/71704
1963         * parse.c (matchs, matcho): Move right before decode_omp_directive.
1964         If spec_only, only gfc_match the keyword and if successful, goto
1965         do_spec_only.
1966         (matchds, matchdo): Define.
1967         (decode_omp_directive): Add spec_only local var and set it.
1968         Use matchds or matchdo macros instead of matchs or matcho
1969         for declare target, declare simd, declare reduction and threadprivate
1970         directives.  Return ST_GET_FCN_CHARACTERISTICS if a non-declarative
1971         directive could be matched.
1972         (next_statement): For ST_GET_FCN_CHARACTERISTICS restore
1973         gfc_current_locus from old_locus even if there is no label.
1975         PR fortran/71705
1976         * trans-openmp.c (gfc_trans_omp_clauses): Set TREE_ADDRESSABLE on
1977         decls in to/from clauses.
1979 2016-06-29  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
1981         PR fortran/71686
1982         * scanner.c (gfc_next_char_literal): Only decrement nextc if it
1983         is not NULL.
1985 2016-06-29  Cesar Philippidis  <cesar@codesourcery.com>
1987         * openmp.c (match_oacc_clause_gang): Rename to ...
1988         (match_oacc_clause_gwv): this.  Add support for OpenACC worker and
1989         vector clauses.
1990         (gfc_match_omp_clauses): Use match_oacc_clause_gwv for
1991         OMP_CLAUSE_{GANG,WORKER,VECTOR}.  Propagate any MATCH_ERRORs for
1992         invalid OMP_CLAUSE_{ASYNC,WAIT,GANG,WORKER,VECTOR} clauses.
1993         (gfc_match_oacc_wait): Propagate MATCH_ERROR for invalid
1994         oacc_expr_lists.  Adjust the first and needs_space arguments to
1995         gfc_match_omp_clauses.
1997 2016-06-29  Richard Biener  <rguenther@suse.de>
1999         PR middle-end/71002
2000         * f95-lang.c (LANG_HOOKS_GET_ALIAS_SET): Remove (un-)define.
2001         (gfc_get_alias_set): Remove.
2003 2016-06-25  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2005         PR fortran/71649
2006         * module.c (create_intrinsic_function): Check for NULL values and
2007         return after giving error.
2009 2016-06-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
2011         * trans-types.c (gfc_build_complex_type): Move setting complex
2012         MODE to layout_type, instead of setting it ahead of time by the
2013         caller.
2015 2016-06-21  Tobias Burnus  <burnus@net-b.de>
2017         PR fortran/71068
2018         * resolve.c (resolve_function): Don't resolve caf_get/caf_send.
2019         (check_data_variable): Strip-off caf_get before checking.
2021 2016-06-20  Tobias Burnus  <burnus@net-b.de>
2023         PR fortran/71194
2024         * trans-expr.c (gfc_trans_pointer_assignment): Correctly handle
2025         RHS pointer functions.
2027 2016-06-19  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
2029         * class.c (gfc_add_class_array_ref): Call gfc_add_data_component()
2030         instead of gfc_add_component_ref().
2031         (gfc_get_len_component): Call gfc_add_len_component() instead of
2032         gfc_add_component_ref().
2033         * trans-intrinsic.c (gfc_conv_intrinsic_loc): Call
2034         gfc_add_data_component() instead of gfc_add_component_ref().
2035         * trans.c (gfc_add_finalizer_call): Call
2036         gfc_add_final_component() and gfc_add_size_component() instead
2037         of gfc_add_component_ref.
2039 2016-06-18  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
2041         * trans-types.c (gfc_typenode_for_spec): Commentary typo fix.
2043 2016-06-17  Cesar Philippidis  <cesar@codesourcery.com>
2045         * openmp.c (match_acc): New generic function to parse OpenACC
2046         directives.
2047         (gfc_match_oacc_parallel_loop): Use it.
2048         (gfc_match_oacc_parallel): Likewise.
2049         (gfc_match_oacc_kernels_loop): Likewise.
2050         (gfc_match_oacc_kernels): Likewise.
2051         (gfc_match_oacc_data): Likewise.
2052         (gfc_match_oacc_host_data): Likewise.
2053         (gfc_match_oacc_loop): Likewise.
2054         (gfc_match_oacc_enter_data): Likewise.
2055         (gfc_match_oacc_exit_data): Likewise.
2057 2016-06-16  Martin Liska  <mliska@suse.cz>
2059         * trans-stmt.c (gfc_trans_simple_do): Predict the edge.
2061 2016-06-16  Martin Liska  <mliska@suse.cz>
2063         * trans-array.c (gfc_array_allocate): Do not generate expect
2064         stmt.
2065         * trans.c (gfc_allocate_using_malloc): Properly set FAIL_ALLOC
2066         predictor for malloc return value.
2067         (gfc_allocate_allocatable): Use REALLOC predictor instead of
2068         FAIL_ALLOC.
2069         (gfc_deallocate_with_status): Likewise.
2071 2016-06-13  Paul Thomas  <pault@gcc.gnu.org>
2073         PR fortran/70673
2074         * frontend-passes.c (realloc_string_callback): Add a call to
2075         gfc_dep_compare_expr.
2077 2016-06-11  Dominique d'Humieres  <dominiq@lps.ens.fr>
2079         PR fortran/60751
2080         * io.c (gfc_resolve_dt): Replace GFC_STD_GNU with GFC_STD_LEGACY.
2082 2016-06-10  Thomas Schwinge  <thomas@codesourcery.com>
2084         PR c/71381
2085         * openmp.c (gfc_match_oacc_cache): Add comment.
2087 2016-06-05  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2089         PR fortran/71404
2090         * io.c (match_io): For READ, commit in pending symbols in the
2091         current statement before trying to match an expression so that
2092         if the match fails and we undo symbols we dont toss good symbols.
2094 2016-06-05  Andre Vehreschild  <vehre@gcc.gnu.org>
2096         PR fortran/69659
2097         * trans-array.c (gfc_trans_dummy_array_bias): For class arrays use
2098         the address of the _data component to reference the arrays data
2099         component.
2101 2016-06-03  Chung-Lin Tang  <cltang@codesourcery.com>
2103         * trans-openmp.c (gfc_trans_omp_reduction_list): Add mark_addressable
2104         bool parameter, set reduction clause DECLs as addressable when true.
2105         (gfc_trans_omp_clauses): Pass clauses->async to
2106         gfc_trans_omp_reduction_list, add comment describing OpenACC situation.
2108 2016-06-01  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2110         PR fortran/52393
2111         * io.c (match_io): For READ, try to match a default character
2112         expression. If found, set the dt format expression to this,
2113         otherwise go back and try control list.
2115 2016-06-01  Paul Thomas  <pault@gcc.gnu.org>
2117         PR fortran/71156
2118         * decl.c (copy_prefix): Add checks that the module procedure
2119         declaration prefixes are compliant with the interface. Invert
2120         order of existing elemental and pure checks.
2121         * resolve.c (resolve_fl_procedure): Invert order of elemental
2122         and pure errors.
2124 2016-06-01  Jakub Jelinek  <jakub@redhat.com>
2126         * parse.c (case_decl): Move ST_OMP_* to ...
2127         (case_omp_decl): ... here, new macro.
2128         (verify_st_order): For case_omp_decl, complain about
2129         p->state >= ORDER_EXEC, but don't change p->state otherwise.
2131 2016-05-26  Jakub Jelinek  <jakub@redhat.com>
2133         * openmp.c (resolve_omp_clauses): Warn if chunk_size is known not to
2134         be positive.
2136 2016-05-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2138         PR fortran/66461
2139         * scanner.c (gfc_next_char_literal): Clear end_flag when adjusting
2140         current locus back to old_locus.
2142 2016-05-20  Jakub Jelinek  <jakub@redhat.com>
2144         PR fortran/71204
2145         * frontend-passes.c (realloc_string_callback): Clear inserted_block
2146         and changed_statement before calling create_var.
2148 2016-05-15  Harald Anlauf  <anlauf@gmx.de>
2150         PR fortran/69603
2151         * interface.c (compare_parameter): Check for non-NULL pointer.
2153 2016-05-14  Fritz Reese  <fritzoreese@gmail.com>
2155         * gfortran.texi: Update example of DEC UNION extension.
2157 2016-05-14  Fritz Reese  <fritzoreese@gmail.com>
2159         PR fortran/71047
2160         * expr.c (gfc_default_initializer): Avoid extra component refs in
2161         constructors for derived types and classes.
2163 2016-05-11  Jakub Jelinek  <jakub@redhat.com>
2165         PR fortran/70855
2166         * frontend-passes.c (inline_matmul_assign): Disable in !$omp workshare.
2168 2016-05-09  Richard Biener  <rguenther@suse.de>
2170         PR fortran/70937
2171         * trans-decl.c: Include gimplify.h for unshare_expr.
2172         (gfc_trans_vla_one_sizepos): Unshare exprs before inserting
2173         them into the IL.
2175 2016-05-07  Fritz Reese  <fritzoreese@gmail.com>
2177         PR fortran/56226
2178         * module.c (dt_upper_string): Rename to gfc_dt_upper_string
2179         (dt_lower_string): Likewise.
2180         * gfortran.h: Make new gfc_dt_upper/lower_string global.
2181         * class.c: Use gfc_dt_upper_string.
2182         * decl.c: Likewise.
2183         * symbol.c: Likewise.
2184         * resolve.c (resolve_component): New function.
2185         (resolve_fl_derived0): Move component loop code to resolve_component.
2186         * parse.c (check_component): New function.
2187         (parse_derived): Move loop code to check_component.
2188         * lang.opt, invoke.texi, options.c : New option -fdec-structure.
2189         * libgfortran.h (bt): New basic type BT_UNION.
2190         * gfortran.h (gfc_option): New option -fdec-structure.
2191         (gfc_get_union_type, gfc_compare_union_types): New prototypes.
2192         (gfc_bt_struct, gfc_fl_struct, case_bt_struct, case_fl_struct): New
2193         macros.
2194         (gfc_find_component): Change prototype.
2195         * match.h (gfc_match_member_sep, gfc_match_map, gfc_match_union,
2196         gfc_match_structure_decl): New prototypes.
2197         * parse.h (gfc_comp_struct): New macro.
2198         * symbol.c (gfc_find_component): Search for components in nested unions
2199         * class.c (insert_component_ref, gfc_add_component_ref, add_proc_comp,
2200         copy_vtab_proc_comps): Update calls to gfc_find_component.
2201         * primary.c (gfc_convert_to_structure_constructor): Likewise.
2202         * symbol.c (gfc_add_component): Likewise.
2203         * resolve.c (resolve_typebound_function, resolve_typebound_subroutine,
2204         resolve_typebound_procedure, resolve_component, resolve_fl_derived):
2205         Likewise.
2206         * expr.c (get_union_init, component_init): New functions.
2207         * decl.c (match_clist_expr, match_record_decl, get_struct_decl,
2208         gfc_match_map, gfc_match_union, gfc_match_structure_decl): Likewise.
2209         * interface.c (compare_components, gfc_compare_union_types): Likewise.
2210         * match.c (gfc_match_member_sep): Likewise.
2211         * parse.c (check_component, parse_union, parse_struct_map): Likewise.
2212         * resolve.c (resolve_fl_struct): Likewise.
2213         * symbol.c (find_union_component): Likewise.
2214         * trans-types.c (gfc_get_union_type): Likewise.
2215         * parse.c (parse_derived): Use new functions.
2216         * interface.c (gfc_compare_derived_types, gfc_compare_types): Likewise.
2217         * expr.c (gfc_default_initializer): Likewise.
2218         * gfortran.texi: Support for DEC structures, unions, and maps.
2219         * gfortran.h (gfc_statement, sym_flavor): Likewise.
2220         * check.c (gfc_check_kill_sub): Likewise.
2221         * expr.c (gfc_copy_expr, simplify_const_ref,
2222         gfc_has_default_initializer): Likewise.
2223         * decl.c (build_sym, match_data_constant, add_init_expr_to_sym,
2224         match_pointer_init, build_struct, variable_decl,
2225         gfc_match_decl_type_spec, gfc_mach_data-decl, gfc_match_entry,
2226         gfc_match_end, gfc_match_derived_decl): Likewise.
2227         * interface.c (check_interface0, check_interface1,
2228         gfc_search_interface): Likewise.
2229         * misc.c (gfc_basic_typename, gfc_typename): Likewise.
2230         * module.c (add_true_name, build_tnt, bt_types, mio_typespec,
2231         fix_mio_expr, load_needed, mio_symbol, read_module, write_symbol,
2232         gfc_get_module_backend_decl): Likewise.
2233         * parse.h (gfc_compile_state): Likewise.
2234         * parse.c (decode_specification_statement, decode_statement,
2235         gfc_ascii_statement, verify_st_order, parse_spec): Likewise.
2236         * primary.c (gfc_match_varspec, gfc_match_structure_constructor,
2237         gfc_match_rvalue, match_variable): Likewise.
2238         * resolve.c (find_arglists, resolve_structure_cons,
2239         is_illegal_recursion, resolve_generic_f, get_declared_from_expr,
2240         resolve_typebound_subroutine, resolve_allocate_expr,
2241         nonscalar_typebound_assign, generate_component_assignments,
2242         resolve_fl_variable_derived, check_defined_assignments,
2243         resolve_component, resolve_symbol, resolve_equivalence_derived):
2244         Likewise.
2245         * symbol.c (flavors, check_conflict, gfc_add_flavor, gfc_use_derived,
2246         gfc_restore_last_undo_checkpoint, gfc_type_compatible,
2247         gfc_find_dt_in_generic): Likewise.
2248         * trans-decl.c (gfc_get_module_backend_decl, create_function_arglist,
2249         gfc_create_module_variable, check_constant_initializer): Likewise.
2250         * trans-expr.c (gfc_conv_component_ref, gfc_conv_initializer,
2251         gfc_trans_alloc_subarray_assign, gfc_trans_subcomponent_assign,
2252         gfc_conv_structure, gfc_trans_scalar_assign, copyable_array_p):
2253         Likewise.
2254         * trans-io.c (transfer_namelist_element, transfer_expr,
2255         gfc_trans_transfer): Likewise.
2256         * trans-stmt.c (gfc_trans_deallocate): Likewise.
2257         * trans-types.c (gfc_typenode_for_spec, gfc_copy_dt_decls_ifequal,
2258         gfc_get_derived_type): Likewise.
2260 2016-05-05  Jakub Jelinek  <jakub@redhat.com>
2262         * openmp.c (gfc_match_omp_clauses): Restructuralize, so that clause
2263         parsing is done in a big switch based on gfc_peek_ascii_char and
2264         individual clauses under their first letters are sorted too.
2266 2016-05-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
2268         * trans-types.c (gfc_build_complex_type):
2270 2016-05-02  Richard Biener  <rguenther@suse.de>
2272         * trans-array.c (gfc_trans_create_temp_array): Properly
2273         create a DECL_EXPR for the anonymous VLA array type.
2275 2016-04-29  Cesar Philippidis  <cesar@codesourcery.com>
2277         PR middle-end/70626
2278         * trans-openmp.c (gfc_trans_oacc_combined_directive): Duplicate
2279         the reduction clause in both parallel and loop directives.
2281 2016-04-18  Michael Matz  <matz@suse.de>
2283         * trans-io.c (gfc_build_io_library_fndecls): Use SET_TYPE_ALIGN.
2284         * trans-common.c (build_common_decl): Use SET_DECL_ALIGN.
2285         * trans-types.c (gfc_add_field_to_struct): Use SET_DECL_ALIGN.
2287 2016-04-13  Dominique d'Humieres  <dominiq@lps.ens.fr>
2289         PR fortran/67039
2290         * intrinsic.texi: Correct the documentation of pseudorandom
2291         number intrinsics.
2293 2016-04-13  Dominique d'Humieres  <dominiq@lps.ens.fr>
2295         PR fortran/58000
2296         * gfortran.texi: Document OPEN( ... NAME=) as not implemented
2297         in GNU Fortran
2299 2016-04-09  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2301         PR fortran/68566
2302         * array.c (match_array_element_spec): Add check for non-integer.
2303         * simplify.c (gfc_simplify_reshape): If source shape is NULL return.
2305 2016-04-06  Patrick Palka  <ppalka@gcc.gnu.org>
2307         PR c/70436
2308         * openmp.c (gfc_find_omp_udr): Add explicit braces to resolve a
2309         future -Wparentheses warning.
2311 2016-04-04  Andre Vehreschild  <vehre@gcc.gnu.org>
2313         PR fortran/67538
2314         * resolve.c (resolve_allocate_expr): Emit error message when no
2315         array spec and no array valued source= expression is given in an
2316         F2008 allocate() for an array to allocate.
2318 2016-04-04  Andre Vehreschild  <vehre@gcc.gnu.org>
2320         PR fortran/65795
2321         * trans-array.c (gfc_array_allocate): When the array is a coarray,
2322         do not nullyfing its allocatable components in array_allocate, because
2323         the nullify missed the array ref and nullifies the wrong component.
2324         Cosmetics.
2326 2016-03-29  Andre Vehreschild  <vehre@gcc.gnu.org>
2328         PR fortran/70397
2329         * trans-expr.c (gfc_class_len_or_zero_get): Add function to return a
2330         constant zero tree, when the class to get the _len component from is
2331         not unlimited polymorphic.
2332         (gfc_copy_class_to_class): Use the new function.
2333         * trans.h: Added interface of new function gfc_class_len_or_zero_get.
2335 2016-03-28  Alessandro Fanfarillo  <fanfarillo.gcc@gmail.com>
2337         * trans-decl.c (gfc_build_builtin_function_decls):
2338         caf_stop_numeric and caf_stop_str definition.
2339         * trans-stmt.c (gfc_trans_stop): invoke external functions
2340         for stop and stop_str when coarrays are used.
2341         * trans.h: extern for new functions.
2343 2016-03-19  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2345         PR fortran/69043
2346         * scanner.c (load_file): Update to use S_ISREG macro.
2348 2016-03-17  Thomas Schwinge  <thomas@codesourcery.com>
2350         * gfortran.h (enum gfc_omp_map_op): Rename OMP_MAP_FORCE_DEALLOC
2351         to OMP_MAP_DELETE.  Adjust all users.
2353 2016-03-13  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2354             Jim MacArthur  <jim.macarthur@codethink.co.uk>
2356         PR fortran/69043
2357         * scanner.c (load_file): Check that included file is regular.
2359 2016-03-12  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2360             Harold Anlauf  <anlauf@gmx.de>
2362         PR fortran/69520
2363         * invoke.texi: Explain use of the 'no-' construct within the
2364         -fcheck= option.
2365         * options.c (gfc_handle_runtime_check_option): Enable use of
2366         'no-' prefix for the various options with -fcheck= to allow
2367         negating previously enabled check options.
2369 2016-03-12  Paul Thomas  <pault@gcc.gnu.org>
2371         PR fortran/70031
2372         * decl.c (gfc_match_prefix): Treat the 'module' prefix in the
2373         same way as the others, rather than fixing it to come last.
2374         (gfc_match_function_decl, gfc_match_subroutine): After errors
2375         in 'copy_prefix', emit them immediately in the case of module
2376         procedures to prevent a later ICE.
2378         PR fortran/69524
2379         * decl.c (gfc_match_submod_proc): Permit 'module procedure'
2380         declarations within the contains section of modules as well as
2381         submodules.
2382         * resolve.c (resolve_fl_procedure): Likewise.
2383         *trans-decl.c (build_function_decl): Change the gcc_assert to
2384         allow all forms of module procedure declarations within module
2385         contains sections.
2387 2016-02-28  Thomas Koenig  <tkoenig@gcc.gnu.org>
2389         PR fortran/68147
2390         PR fortran/47674
2391         * frontend-passes.c (realloc_string_callback): Don't set
2392         walk_subtrees.
2394 2016-02-28  Thomas Koenig  <tkoenig@gcc.gnu.org>
2396         * dump-parse-tree.c (show_code_node):  Print association
2397         list of a block if present.  Handle EXEC_END_BLOCK.
2399 2016-02-28  Harald Anlauf  <anlauf@gmx.de>
2400             Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2402         PR fortran/56007
2403         * match.c (gfc_match_iterator): Add diagnostic for array variable
2404         as do loop index.
2406 2016-02-27  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2407             Steven G. Kargl  <kargl@gcc.gnu.org>
2409         PR fortran/69910
2410         * io.c (gfc_match_open): Check that open status is an expression
2411         constant before comparing string to 'scratch' with NEWUNIT.
2413 2016-02-27  Alessandro Fanfarillo  <fanfarillo.gcc@gmail.com>
2415         * trans.c (gfc_allocate_allocatable): size conversion
2416         from byte to number of elements for event variables.
2417         * trans-types.c (gfc_get_derived_type): event variables
2418         represented as a pointer (like lock variable).
2420 2016-02-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2422         PR fortran/61156
2423         * scanner.c (add_path_to_list): If include path is not a directory,
2424         issue a fatal error.
2426 2016-02-23  Andre Vehreschild  <vehre@gcc.gnu.org>
2428         PR fortran/67451
2429         * trans-array.c (gfc_array_allocate): Take the attributes from the
2430         expression to allocate and not from the source=-expression.
2432 2016-02-20  Paul Thomas  <pault@gcc.gnu.org>
2434         PR fortran/69423
2435         * trans-decl.c (create_function_arglist): Deferred character
2436         length functions, with and without declared results, address
2437         the passed reference type as '.result' and the local string
2438         length as '..result'.
2439         (gfc_null_and_pass_deferred_len): Helper function to null and
2440         return deferred string lengths, as needed.
2441         (gfc_trans_deferred_vars): Call it, thereby reducing repeated
2442         code, add call for deferred arrays and reroute pointer function
2443         results. Avoid using 'tmp' for anything other that a temporary
2444         tree by introducing 'type_of_array' for the arrayspec type.
2446 2015-02-16  Thomas Koenig  <tkoenig@gcc.gnu.org>
2448         PR fortran/69742
2449         * frontend-passes.c (cfe-expr_0):  Don't register functions
2450         from within an ASSOCIATE statement.
2452 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
2454         PR fortran/60526
2455         * decl.c (build_sym):  If the name has already been defined as a
2456         type, it has a symtree with an upper case letter at the beginning.
2457         If such a symtree exists, issue an error and exit.  Don't do
2458         this if there is no corresponding upper case letter.
2460 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
2462         PR fortran/60526
2463         PR bootstrap/69816
2464         * decl.c (build_sym):  Reverted previous patch.
2466 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
2468         PR fortran/60526
2469         * decl.c (build_sym):  If the name has already been defined as a
2470         type, issue error and return false.
2472 2016-02-12  David Malcolm  <dmalcolm@redhat.com>
2474         PR other/69554
2475         * error.c (gfc_diagnostic_start_span): New function.
2476         (gfc_diagnostics_init): Initialize global_dc's start_span.
2478 2016-02-11  Andre Vehreschild  <vehre@gcc.gnu.org>
2480         PR fortran/69296
2481         * gfortran.h: Added flag to gfc_association_list indicating that
2482         the rank of an associate variable has been guessed only.
2483         * parse.c (parse_associate): Set the guess flag mentioned above
2484         when guessing the rank of an expression.
2485         * resolve.c (resolve_assoc_var): When the rank has been guessed,
2486         make sure, that the guess was correct else overwrite with the actual
2487         rank.
2488         * trans-stmt.c (trans_associate_var): For subref_array_pointers in
2489         class objects, take the span from the _data component.
2491 2016-02-07  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2493         PR fortran/50555
2494         * primary.c (match_actual_arg): If symbol has attribute flavor of
2495         namelist, generate an error. (gfc_match_rvalue): Likewise return
2496         MATCH_ERROR.
2497         * resolve.c (resolve_symbol): Scan arument list of procedures and
2498         generate an error if a namelist is found.
2500 2016-02-05  Mikael Morin  <mikael@gcc.gnu.org>
2502         PR fortran/66089
2503         * trans-expr.c (expr_is_variable, gfc_expr_is_variable): Rename
2504         the former to the latter and make it non-static.  Update callers.
2505         * gfortran.h (gfc_expr_is_variable): New declaration.
2506         (struct gfc_ss_info): Add field needs_temporary.
2507         * trans-array.c (gfc_scalar_elemental_arg_saved_as_argument):
2508         Tighten the condition on aggregate expressions with a check
2509         that the expression is a variable and doesn't need a temporary.
2510         (gfc_conv_resolve_dependency): Add intermediary reference variable.
2511         Set the needs_temporary field.
2513 2016-02-03  Andre Vehreschild  <vehre@gcc.gnu.org>
2515         PR fortran/67451
2516         PR fortran/69418
2517         * trans-expr.c (gfc_copy_class_to_class): For coarrays just the
2518         pointer is passed.  Take it as is without trying to deref the
2519         _data component.
2520         * trans-stmt.c (gfc_trans_allocate): Take care of coarrays as
2521         argument to source=-expression.
2523 2016-02-02  Nathan Sidwell  <nathan@codesourcery.com>
2525         * lang.opt (fopenacc-dim=): New option.
2527 2016-01-31  Paul Thomas  <pault@gcc.gnu.org>
2529         PR fortran/67564
2530         * trans-expr.c (gfc_conv_procedure_call): For the vtable copy
2531         subroutines, add a string length argument, when the actual
2532         argument is an unlimited polymorphic class object.
2534 2016-01-30  Paul Thomas  <pault@gcc.gnu.org>
2536         PR fortran/69566
2537         * trans-expr.c (gfc_conv_procedure_call): Correct expression
2538         for 'ulim_copy', which was missing a test for 'comp'.
2540 2016-01-28  Andre Vehreschild  <vehre@gcc.gnu.org>
2542         PR fortran/62536
2543         * decl.c (gfc_match_end): Only unnest and remove BLOCK namespaces
2544         when the END encountered does not match a BLOCK's end.
2546 2016-01-27  Janus Weil  <janus@gcc.gnu.org>
2548         PR fortran/69484
2549         * invoke.texi: Fix documentation of -Wall with respect to -Wtabs.
2551 2016-01-27  Paul Thomas  <pault@gcc.gnu.org>
2553         PR fortran/69422
2554         * trans-expr.c (is_scalar_reallocatable_lhs): Remove the check
2555         for allocatable components, whilst checking if the symbol is a
2556         derived or class entity..
2558 2016-01-26  Paul Thomas  <pault@gcc.gnu.org>
2560         PR fortran/69385
2561         * trans-expr.c (gfc_trans_assignment_1): Exclude initialization
2562         assignments from check on assignment of scalars to unassigned
2563         arrays and correct wrong code within the corresponding block.
2565 2016-01-26  David Malcolm  <dmalcolm@redhat.com>
2567         PR other/69006
2568         * error.c (gfc_diagnostic_starter): Delete use of pp_newline.
2570 2016-01-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2572         PR fortran/69397
2573         PR fortran/68442
2574         * interface.c (gfc_arglist_matches_symbol): Replace assert with
2575         a return false if not a procedure.
2576         * resolve.c (resolve_generic_f): Test if we are resolving an
2577         initialization expression and adjust error message accordingly.
2579 2016-01-24  Thomas Koenig  <tkoenig@gcc.gnu.org>
2581         PR fortran/66094
2582         * frontend-passes.c (matmul_lhs_realloc):  Add
2583         forgotten break statement.
2585 2016-01-24  Dominique d'Humieres  <dominiq@lps.ens.fr>
2587         PR fortran/68283
2588         * primary.c (gfc_variable_attr): revert revision r221955,
2589         call gfc_internal_error only if there is no error.
2591 2016-01-24  Thomas Koenig  <tkoenig@gcc.gnu.org>
2593         PR fortran/66094
2594         * frontend-passes.c (enum matrix_case):  Add case A2B2T for
2595         MATMUL(A,TRANSPoSE(B)) where A and B are rank 2.
2596         (inline_limit_check):  Also add A2B2T.
2597         (matmul_lhs_realloc):  Handle A2B2T.
2598         (check_conjg_variable):  Rename to
2599         (check_conjg_transpose_variable):  and also count TRANSPOSE.
2600         (inline_matmul_assign):  Handle A2B2T.
2602 2016-01-21  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
2604         PR fortran/65996
2605         * error.c (gfc_error): Save the state of abort_on_error and set
2606         it to false for buffered errors to allow normal processing.
2607         Restore the state before leaving.
2609 2016-01-19  Martin Jambor  <mjambor@suse.cz>
2611         * types.def (BT_FN_VOID_UINT_PTR_INT_PTR): New.
2612         (BT_FN_VOID_INT_OMPFN_SIZE_PTR_PTR_PTR_UINT_PTR_INT_INT): Removed.
2613         (BT_FN_VOID_INT_OMPFN_SIZE_PTR_PTR_PTR_UINT_PTR_PTR): New.
2615 2016-01-15  Paul Thomas  <pault@gcc.gnu.org>
2617         PR fortran/64324
2618         * resolve.c (check_uop_procedure): Prevent deferred length
2619         characters from being trapped by assumed length error.
2621         PR fortran/49630
2622         PR fortran/54070
2623         PR fortran/60593
2624         PR fortran/60795
2625         PR fortran/61147
2626         PR fortran/64324
2627         * trans-array.c (gfc_conv_scalarized_array_ref): Pass decl for
2628         function as well as variable expressions.
2629         (gfc_array_init_size): Add 'expr' as an argument. Use this to
2630         correctly set the descriptor dtype for deferred characters.
2631         (gfc_array_allocate): Add 'expr' to the call to
2632         'gfc_array_init_size'.
2633         * trans.c (gfc_build_array_ref): Expand logic for setting span
2634         to include indirect references to character lengths.
2635         * trans-decl.c (gfc_get_symbol_decl): Ensure that deferred
2636         result char lengths that are PARM_DECLs are indirectly
2637         referenced both for directly passed and by reference.
2638         (create_function_arglist): If the length type is a pointer type
2639         then store the length as the 'passed_length' and make the char
2640         length an indirect reference to it.
2641         (gfc_trans_deferred_vars): If a character length has escaped
2642         being set as an indirect reference, return it via the 'passed
2643         length'.
2644         * trans-expr.c (gfc_conv_procedure_call): The length of
2645         deferred character length results is set TREE_STATIC and set to
2646         zero.
2647         (gfc_trans_assignment_1): Do not fix the rse string_length if
2648         it is a variable, a parameter or an indirect reference. Add the
2649         code to trap assignment of scalars to unallocated arrays.
2650         * trans-stmt.c (gfc_trans_allocate): Remove 'def_str_len' and
2651         all references to it. Instead, replicate the code to obtain a
2652         explicitly defined string length and provide a value before
2653         array allocation so that the dtype is correctly set.
2654         trans-types.c (gfc_get_character_type): If the character length
2655         is a pointer, use the indirect reference.
2657 2016-01-10  Thomas Koenig  <tkoenig@gcc.gnu.org>
2659         PR fortran/69154
2660         * frontend-passes.c (in_where):  New variable.
2661         (inline_matmul_assign):  Don't try this if we are within
2662         a WHERE statement.
2663         (gfc_code_walker):  Keep track of in_where.
2665 2016-01-10  Paul Thomas  <pault@gcc.gnu.org>
2667         PR fortran/67779
2668         * trans_array.c (gfc_conv_scalarized_array_ref): Add missing
2669         se->use_offset from condition for calculation of 'base'.
2671 2016-01-08  Jakub Jelinek  <jakub@redhat.com>
2673         PR fortran/69128
2674         * trans.h (OMPWS_SCALARIZER_BODY): Define.
2675         (OMPWS_NOWAIT): Renumber.
2676         * trans-stmt.c (gfc_trans_where_3): Only set OMPWS_SCALARIZER_WS
2677         if OMPWS_SCALARIZER_BODY is not set already, and set also
2678         OMPWS_SCALARIZER_BODY until the final loop creation.
2679         * trans-expr.c (gfc_trans_assignment_1): Likewise.
2680         * trans-openmp.c (gfc_trans_omp_workshare): Also clear
2681         OMPWS_SCALARIZER_BODY.
2682         * trans-array.c (gfc_trans_scalarized_loop_end): Don't create
2683         OMP_FOR if OMPWS_SCALARIZER_BODY is set.
2685 2016-01-04  Jakub Jelinek  <jakub@redhat.com>
2687         Update copyright years.
2689         * gfortranspec.c (lang_specific_driver): Update copyright notice
2690         dates.
2691         * gfc-internals.texi: Bump @copying's copyright year.
2692         * gfortran.texi: Ditto.
2693         * intrinsic.texi: Ditto.
2694         * invoke.texi: Ditto.
2696 2016-01-01  Paul Thomas  <pault@gcc.gnu.org>
2698         PR fortran/68864
2699         * trans-array.c (evaluate_bound): If deferred, test that 'desc'
2700         is an array descriptor before using gfc_conv_descriptor_xxx.
2702 Copyright (C) 2016 Free Software Foundation, Inc.
2704 Copying and distribution of this file, with or without modification,
2705 are permitted in any medium without royalty provided the copyright
2706 notice and this notice are preserved.