OSDN Git Service

gcc/
[pf3gnuchains/gcc-fork.git] / gcc / fortran / ChangeLog
1 2010-04-09  Iain Sandoe  <iains@gcc.gnu.org>
2
3         PR bootstrap/43684
4         * gfortranspec.c (lang_specific_driver): Do not expose vars 
5         only used by HAVE_LD_STATIC_DYNAMIC targets unless compiling
6         for such.
7
8 2010-04-09  Tobias Burnus  <burnus@net-b.de>
9
10         PR fortran/18918
11         * decl.c (variable_decl, match_attr_spec): Fix setting the array
12         spec.
13         * array.c (match_subscript,gfc_match_array_ref): Add coarray support.
14         * data.c (gfc_assign_data_value): Ditto.
15         * expr.c (gfc_check_pointer_assign): Add check for coarray constraint.
16         (gfc_traverse_expr): Traverse also through codimension expressions.
17         (gfc_is_coindexed, gfc_has_ultimate_allocatable,
18         gfc_has_ultimate_pointer): New functions.
19         * gfortran.h (gfc_array_ref_dimen_type): Add DIMEN_STAR for coarrays.
20         (gfc_array_ref): Add codimen.
21         (gfc_array_ref): Add in_allocate.
22         (gfc_is_coindexed, gfc_has_ultimate_allocatable,
23         gfc_has_ultimate_pointer): Add prototypes.
24         * interface.c (compare_parameter, compare_actual_formal,
25         check_intents): Add coarray constraints.
26         * match.c (gfc_match_iterator): Add coarray constraint.
27         * match.h (gfc_match_array_ref): Update interface.
28         * primary.c (gfc_match_varspec): Handle codimensions.
29         * resolve.c (coarray_alloc, inquiry_argument): New static variables.
30         (check_class_members): Return gfc_try instead for error recovery.
31         (resolve_typebound_function,resolve_typebound_subroutine,
32         check_members): Handle return value of check_class_members.
33         (resolve_structure_cons, resolve_actual_arglist, resolve_function,
34         check_dimension, compare_spec_to_ref, resolve_array_ref,
35         resolve_ref, resolve_variable, gfc_resolve_expr, conformable_arrays,
36         resolve_allocate_expr, resolve_ordinary_assign): Add coarray
37         support.
38         * trans-array.c (gfc_conv_array_ref, gfc_walk_variable_expr):
39         Skip over coarray refs.
40         (gfc_array_allocate) Add support for references containing coindexes.
41         * trans-expr.c (gfc_add_interface_mapping): Copy coarray attribute.
42         (gfc_map_intrinsic_function): Ignore codimensions.
43
44 2010-04-08  Bud Davis  <bdavis9659@sbcglobal.net>
45
46         PR fortran/28039
47         * io.c (check_format_string):  Added check for additional non 
48         blank characters after the format string was successfully 
49         parsed.
50         * io.c (check_format): Changed the error messages for positive
51         int required and period required to drop through the error logic
52         and report with gfc_error instead of gfc_error_now.  Corrected
53         format postion for hollerith strings.
54
55 2010-04-08  Tobias Burnus  <burnus@net-b.de>
56
57         * module.c (use_iso_fortran_env_module): Fix standard check.
58
59 2010-04-07  Jakub Jelinek  <jakub@redhat.com>
60
61         * parse.c (parse_derived, parse_enum): Avoid set but not used
62         warning.
63
64 2010-04-07  Janne Blomqvist  <jb@gcc.gnu.org>
65
66         PR fortran/40539
67         * gfortran.texi: Add section about representation of
68         LOGICAL variables.
69
70 2010-04-07  Simon Baldwin  <simonb@google.com>
71
72         * cpp.c (cb_cpp_error): Add warning reason argument, set a value
73         for diagnostic_override_option_index if CPP_W_WARNING_DIRECTIVE.
74
75 2010-04-07  Richard Guenther  <rguenther@suse.de>
76
77         * options.c (gfc_init_options): Do not set.
78
79 2010-04-06  Tobias Burnus  <burnus@net-b.de>
80
81         PR fortran/18918
82         * array.c (gfc_match_array_spec): Add error for -fcoarray=none.
83         * match.c (gfc_match_critical, sync_statement): Ditto.
84         * gfortran.h (gfc_fcoarray): New enum.
85         (gfc_option_t): Use it.
86         * lang.opt (fcoarray): Add new flag.
87         * invoke.texi (fcoarray): Document it.
88         * options.c (gfc_init_options,gfc_handle_option): Handle -fcoarray=.
89         (gfc_handle_coarray_option): New function.
90
91 2010-04-06  Tobias Burnus  <burnus@net-b.de>
92
93         PR fortran/18918
94         * gfortran.h (gfc_array_spec): Add cotype.
95         * array.c (gfc_match_array_spec,gfc_set_array_spec): Use it
96         and defer error diagnostic.
97         * resolve.c (resolve_fl_derived): Add missing check.
98         (resolve_symbol): Add cotype/type check.
99         * parse.c (parse_derived): Fix setting of coarray_comp.
100
101 2010-04-06  Tobias Burnus  <burnus@net-b.de>
102
103         PR fortran/18918
104         * array.c (gfc_free_array_spec,gfc_resolve_array_spec,
105         match_array_element_spec,gfc_copy_array_spec,
106         gfc_compare_array_spec): Include corank.
107         (match_array_element_spec,gfc_set_array_spec): Support codimension.
108         * decl.c (build_sym,build_struct,variable_decl,
109         match_attr_spec,attr_decl1,cray_pointer_decl,
110         gfc_match_volatile): Add codimension.
111         (gfc_match_codimension): New function.
112         * dump-parse-tree.c (show_array_spec,show_attr): Support codimension.
113         * gfortran.h (symbol_attribute,gfc_array_spec): Ditto.
114         (gfc_add_codimension): New function prototype.
115         * match.h (gfc_match_codimension): New function prototype.
116         (gfc_match_array_spec): Update prototype
117         * match.c (gfc_match_common): Update gfc_match_array_spec call.
118         * module.c (MOD_VERSION): Bump.
119         (mio_symbol_attribute): Support coarray attributes.
120         (mio_array_spec): Add corank support.
121         * parse.c (decode_specification_statement,decode_statement,
122         parse_derived): Add coarray support.
123         * resolve.c (resolve_formal_arglist, was_declared,
124         is_non_constant_shape_array, resolve_fl_variable,
125         resolve_fl_derived, resolve_symbol): Add coarray support.
126         * symbol.c (check_conflict, gfc_add_volatile, gfc_copy_attr,
127         gfc_build_class_symbol): Add coarray support.
128         (gfc_add_codimension): New function.
129
130 2010-04-06  Tobias Burnus  <burnus@net-b.de>
131
132         PR fortran/18918
133         * iso-fortran-env.def: Add the integer parameters atomic_int_kind,
134         atomic_logical_kind, iostat_inquire_internal_unit, stat_locked,
135         stat_locked_other_image, stat_stopped_image and stat_unlocked of
136         Fortran 2008.
137         * intrinsic.texi (iso_fortran_env): Ditto.
138         * libgfortran.h (libgfortran_stat_codes): New enum.
139         * module.c (use_iso_fortran_env_module): Honour -std= when loading
140         constants from the intrinsic module.
141
142 2010-04-06  Tobias Burnus  <burnus@net-b.de>
143
144         PR fortran/39997
145         * intrinsic.c (add_functions): Add num_images.
146         * decl.c (gfc_match_end): Handle END CRITICAL.
147         * intrinsic.h (gfc_simplify_num_images): Add prototype.
148         * dump-parse-tree.c (show_code_node): Dump CRITICAL, ERROR STOP,
149         and SYNC.
150         * gfortran.h (gfc_statement): Add enum items for those.
151         (gfc_exec_op) Ditto.
152         (gfc_isym_id): Add num_images.
153         * trans-stmt.c (gfc_trans_stop): Handle ERROR STOP.
154         (gfc_trans_sync,gfc_trans_critical): New functions.
155         * trans-stmt.h (gfc_trans_stop,gfc_trans_sync,
156         gfc_trans_critical): Add/update prototypes.
157         * trans.c (gfc_trans_code): Handle CRITICAL, ERROR STOP,
158         and SYNC statements.
159         * trans.h (gfor_fndecl_error_stop_string) Add variable.
160         * resolve.c (resolve_sync): Add function.
161         (gfc_resolve_blocks): Handle CRITICAL.
162         (resolve_code): Handle CRITICAL, ERROR STOP,
163         (resolve_branch): Add CRITICAL constraint check.
164         and SYNC statements.
165         * st.c (gfc_free_statement): Add new statements.
166         * trans-decl.c (gfor_fndecl_error_stop_string): Global variable.
167         (gfc_build_builtin_function_decls): Initialize it.
168         * match.c (gfc_match_if): Handle ERROR STOP and SYNC.
169         (gfc_match_critical, gfc_match_error_stop, sync_statement,
170         gfc_match_sync_all, gfc_match_sync_images, gfc_match_sync_memory):
171         New functions.
172         (match_exit_cycle): Handle CRITICAL constraint.
173         (gfc_match_stopcode): Handle ERROR STOP.
174         * match.h (gfc_match_critical, gfc_match_error_stop,
175         gfc_match_sync_all, gfc_match_sync_images,
176         gfc_match_sync_memory): Add prototype.
177         * parse.c (decode_statement, gfc_ascii_statement,
178         parse_executable): Handle new statements.
179         (parse_critical_block): New function.
180         * parse.h (gfc_compile_state): Add COMP_CRITICAL.
181         * intrinsic.texi (num_images): Document new function.
182         * simplify.c (gfc_simplify_num_images): Add function.
183
184 2010-04-06  Tobias Burnus  <burnus@net-b.de>
185
186         PR fortran/43178
187         * trans-array.c (gfc_conv_expr_descriptor): Update
188         gfc_trans_scalar_assign call.
189         (has_default_initializer): New function.
190         (gfc_trans_deferred_array): Nullify less often.
191         * trans-expr.c (gfc_conv_subref_array_arg,
192         gfc_trans_subcomponent_assign): Update call to
193         gfc_trans_scalar_assign.
194         (gfc_trans_scalar_assign): Add parameter and pass it on.
195         (gfc_trans_assignment_1): Optionally, do not dealloc before
196         assignment.
197         * trans-openmp.c (gfc_trans_omp_array_reduction): Update
198         call to gfc_trans_scalar_assign.
199         * trans-decl.c (gfc_get_symbol_decl): Do not always apply
200         initializer to static variables.
201         (gfc_init_default_dt): Add dealloc parameter and pass it on.
202         * trans-stmt.c (forall_make_variable_temp,
203         generate_loop_for_temp_to_lhs, generate_loop_for_rhs_to_temp,
204         gfc_trans_forall_1, gfc_trans_where_assign, gfc_trans_where_3
205         gfc_trans_allocate): Update gfc_trans_assignment call.
206         * trans.h (gfc_trans_scalar_assign, gfc_init_default_dt,
207         gfc_init_default_dt, gfc_trans_assignment): Add bool dealloc
208         parameter to prototype.
209
210 2010-03-31  Paul Thomas  <pault@gcc.gnu.org>
211
212         * ioparm.def : Update copyright.
213         * lang.opt : ditto
214         * trans-array.c : ditto
215         * trans-array.h : ditto
216         * expr.c: ditto
217         * trans-types.c: ditto
218         * dependency.c : ditto
219         * gfortran.h : ditto
220         * options.c : ditto
221         * trans-io.c : ditto
222         * trans-intrinsic.c : ditto
223         * libgfortran.h : ditto
224         * invoke.texi : ditto
225         * intrinsic.texi : ditto
226         * trans.c : ditto
227         * trans.h : ditto
228         * intrinsic.c : ditto
229         * interface.c : ditto
230         * iresolve.c : ditto
231         * trans-stmt.c : ditto
232         * trans-stmt.h : ditto
233         * parse,c : ditto
234         * match.h : ditto
235         * error.c : ditto
236
237 2010-03-20  Paul Thomas  <pault@gcc.gnu.org>
238
239         PR fortran/43450
240         * trans-decl.c (gfc_create_module_variable): With -fwhole-file
241         do not assert the context of derived types.
242
243 2010-03-20  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
244
245         PR fortran/43409
246         * ioparm.def: Change inquire size variable to type pointer to
247         GFC_IO_INT type.
248
249 2010-03-18  Paul Thomas  <pault@gcc.gnu.org>
250
251         PR fortran/43039
252         * trans-expr.c (conv_parent_component_references): Ensure that
253         'dt' has a backend_decl.
254
255         PR fortran/43043
256         * trans-expr.c (gfc_conv_structure): Ensure that the derived
257         type has a backend_decl.
258
259         PR fortran/43044
260         * resolve.c (resolve_global_procedure): Check that the 'cl'
261         structure is not NULL.
262
263 2010-03-18  Shujing Zhao  <pearly.zhao@oracle.com>
264
265         * lang.opt (-ffixed-line-length-, ffree-line-length-): Remove
266         redundant tab.
267
268 2010-03-17  Tobias Burnus  <burnus@net-b.de>
269
270         PR fortran/43331
271         * trans-array.c (gfc_conv_array_index_offset,gfc_conv_array_ref,
272         gfc_conv_ss_startstride): Remove no-longer-needed cp_was_assumed
273         check.
274         * decl.c (gfc_match_derived_decl): Don't mark assumed-size Cray
275         pointees as having explizit size.
276         * expr.c (gfc_check_assign): Remove now unreachable Cray pointee
277         check.
278         * trans-types.c (gfc_is_nodesc_array): Add cp_was_assumed to assert.
279         (gfc_sym_type): Don't mark Cray pointees as restricted pointers.
280         * resolve.c (resolve_symbol): Handle cp_was_assumed.
281         * trans-decl.c (gfc_trans_deferred_vars): Ditto.
282         (gfc_finish_var_decl): Don't mark Cray pointees as restricted
283         pointers.
284
285 2010-03-14  Tobias Burnus  <burnus@net-b.de>
286
287         PR fortran/43362
288         * resolve.c (resolve_structure_cons): Add missing PURE constraint.
289         (resolve_ordinary_assign): Add check to avoid segfault.
290
291 2010-03-12  Paul Thomas  <pault@gcc.gnu.org>
292
293         PR fortran/43291
294         PR fortran/43326
295         * resolve.c (resolve_compcall): Add new boolean dummy argument
296         'class_members'. Only resolve expression at end if false.
297         Remove redundant, static variable 'class_object'.
298         (check_class_members): Add extra argument to call of
299         resolve_compcall.
300         (resolve_typebound_function): Renamed resolve_class_compcall.
301         Do all the detection of class references here. Correct calls to
302         resolve_compcall for extra argument.
303         (resolve_typebound_subroutine): resolve_class_typebound_call
304         renamed. Otherwise same as resolve_typebound_function.
305         (gfc_resolve_expr): Call resolve_typebound_function.
306         (resolve_code): Call resolve_typebound_subroutine.
307
308 2010-03-10  Tobias Burnus  <burnus@net-b.de
309
310         PR fortran/43303
311         * symbol.c (get_iso_c_sym): Set sym->result.
312
313 2010-03-08  Janus Weil  <janus@gcc.gnu.org>
314
315         PR fortran/43256
316         * resolve.c (resolve_compcall): Don't set 'value.function.name' here
317         for TBPs, otherwise they will not be resolved properly.
318         (resolve_function): Use 'value.function.esym' instead of
319         'value.function.name' to check if we're dealing with a TBP.
320         (check_class_members): Set correct type of passed object for all TBPs,
321         not only generic ones, except if the type is abstract.
322
323 2010-03-04  Janus Weil  <janus@gcc.gnu.org>
324
325         PR fortran/43244
326         * decl.c (gfc_match_final_decl): Make sure variable names starting with
327         'final...' are not misinterpreted as FINAL statements.
328
329 2010-03-03  Paul Thomas  <pault@gcc.gnu.org>
330
331         PR fortran/43243
332         * trans-array.c (gfc_conv_array_parameter): Contiguous refs to
333         allocatable ultimate components do not need temporaries, whilst
334         ultimate pointer components do.
335
336 2010-03-03  Janus Weil  <janus@gcc.gnu.org>
337
338         PR fortran/43169
339         * resolve.c (resolve_code): Correctly set gfc_current_ns for
340         EXEC_SELECT_TYPE.
341         (gfc_impure_variable): Make it work with sub-namespaces (BLOCK etc).
342         (gfc_pure): Ditto.
343
344 2010-03-02  Paul Thomas  <pault@gcc.gnu.org>
345
346         PR fortran/43180
347         * trans-array.c (gfc_conv_array_parameter): A full array of
348         derived type need not be restricted to a symbol without an
349         array spec to use the call to gfc_conv_expr_descriptor.
350
351         PR fortran/43173
352         * trans-array.c (gfc_conv_array_parameter): Contiguous refs to
353         allocatable arrays do not need temporaries.
354
355 2010-03-01  Tobias Burnus  <burnus@net-b.de>
356
357         PR fortran/43199
358         * resolve.c (find_array_spec): Handle REF_COMPONENT with
359         CLASS components.
360
361 2010-02-28  Tobias Burnus  <burnus@net-b.de>
362
363         PR fortran/43205
364         * trans-expr.c (is_zero_initializer_p): Move up in the file.
365         (gfc_conv_initializer): Handle zero initializer as special case.
366
367 2010-02-27  Tobias Burnus  <burnus@net-b.de>
368
369         PR fortran/43185
370         * resolve.c (resolve_fl_variable_derived): Imply SAVE
371         for module variables for Fortran 2008.
372
373 2010-02-25  Jakub Jelinek  <jakub@redhat.com>
374
375         PR debug/43166
376         * trans-common.c (build_common_decl): Also update DECL_MODE,
377         and DECL_SIZE when encountering a larger common block and call
378         layout_decl.
379
380 2010-02-24  Tobias Burnus  <burnus@net-b.de>              
381
382         PR fortran/43042
383         * trans-expr.c (gfc_conv_initializer): Call directly
384         gfc_conv_constant for C_NULL_(FUN)PTR.              
385
386 2010-02-22  Paul Thomas  <pault@gcc.gnu.org>
387
388         PR fortran/43072
389         * dependency.c (gfc_full_array_ref_p): Check for contiguous by
390         checking the rest of the dimensions for elements.
391
392 2010-02-21  Tobias Burnus  <burnus@net-b.de>
393
394         PR fortran/35259
395         * gfortran.h (gfc_option_t): New flag -fprotect-parens.
396         * lang.opt: Ditto.
397         * option.c (gfc_init_options,gfc_handle_option): Ditto.
398         * trans-expr.c (gfc_conv_expr_op): Use the flag.
399         * invoke.texi: Document new -fno-protect-parens flag.
400
401 2010-02-20  Paul Thomas  <pault@gcc.gnu.org>
402
403         PR fortran/36932
404         PR fortran/36933
405         PR fortran/43072
406         PR fortran/43111
407         * dependency.c (gfc_check_argument_var_dependency): Use enum
408         value instead of arithmetic vaue for 'elemental'.
409         (check_data_pointer_types): New function.
410         (gfc_check_dependency): Call check_data_pointer_types.
411         * trans-array.h : Change fourth argument of
412         gfc_conv_array_parameter to boolean.
413         * trans-array.c (gfc_conv_array_parameter): A contiguous array
414         can be a dummy but it must not be assumed shape or deferred.
415         Change fourth argument to boolean. Array constructor exprs will
416         always be contiguous and do not need packing and unpacking.
417         * trans-expr.c (gfc_conv_procedure_call): Clean up some white
418         space and change fourth argument of gfc_conv_array_parameter
419         to boolean.
420         (gfc_trans_arrayfunc_assign): Change fourth argument of
421         gfc_conv_array_parameter to boolean.
422         * trans-io.c (gfc_convert_array_to_string): The same.
423         * trans-intrinsic.c (gfc_conv_intrinsic_loc): The same.
424
425 2010-02-20  Tobias Burnus  <burnus@net-b.de>
426
427         PR fortran/42958
428         * libgfortran.h: Add GFC_RTCHECK_MEM.
429         * invoke.texi (-fcheck=): Document -fcheck=mem.
430         * tranc.c (gfc_call_malloc): Remove negative-size run-time error
431         and enable malloc-success check only with -fcheck=mem.
432         * option.c (gfc_handle_runtime_check_option): Add -fcheck=mem.
433
434 2010-02-16  Tobias Burnus  <burnus@net-b.de>
435
436         PR fortran/43040
437         * gfortran.h (gfc_isym_id): Rename GFS_ISYM_GAMMA to GFS_ISYM_TGAMMA.
438         * intrinsic.c (add_functions): Ditto.
439         * iresolve.c (gfc_resolve_gamma): Call tgamma instead of gamma.
440         * mathbuiltins.def: Use TGAMMA instead of GAMMA with "tgamma".
441
442 2010-02-14  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
443
444         PR fortran/32382
445         * trans-stmt.h: Add prototype for gfc_trans_code_cond. Add tree cond to
446         gfc_trans_do prototype.
447         * trans-stmt.c (gfc_trans_simple_do): Add optional argument to pass in
448         a loop exit condition.  If exit condition is given, build the loop exit
449         code, checking IO results of implied do loops in READ and WRITE.
450         (gfc_trans_do): Likewise.
451         * trans.c (trans_code): New static work function, previously
452         gfc_trans_code. Passes exit condition to gfc_trans_do.
453         (gfc_trans_code): Calls trans_code with NULL_TREE condition.
454         (gfc_trans_code_cond): Calls trans_code with loop exit condition.
455         * trans-io.c (build_dt): Build an exit condition to allow checking IO
456         result status bits in the dtparm structure. Use this condition in call
457         to gfc_trans_code_cond.
458
459 2010-02-13  Paul Thomas  <pault@gcc.gnu.org>
460
461         PR fortran/41113
462         PR fortran/41117
463         * trans-array.c (gfc_conv_array_parameter): Use
464         gfc_full_array_ref_p to detect full and contiguous variable
465         arrays. Full array components and contiguous arrays do not need
466         internal_pack and internal_unpack.
467
468 2010-02-11  Jakub Jelinek  <jakub@redhat.com>
469
470         PR fortran/43030
471         * resolve.c (gfc_resolve_dim_arg): Call gfc_clear_ts.
472
473         PR fortran/43029
474         * decl.c (enumerator_decl): Don't call gfc_free_enum_history
475         here.
476         (gfc_match_enumerator_def): But here whenever enumerator_decl returns
477         MATCH_ERROR.
478
479 2010-02-10  Joost VandeVondele <jv244@cam.ac.uk>
480             Tobias Burnus <burnus@net-b.de>
481
482         PR fortran/40823
483         * decl.c (gfc_match_subroutine): Explicitly set sym->declared_at.
484
485 2010-02-10  Tobias Burnus  <burnus@net-b.de>
486
487         PR fortran/43015
488         * trans-decl.c (gfc_generate_function_code): Only check
489         actual-vs.-dummy character bounds if not bind(C).
490
491 2010-02-10  Jakub Jelinek  <jakub@redhat.com>
492
493         PR fortran/42309
494         * trans-expr.c (gfc_conv_subref_array_arg): Avoid accessing
495         info->dimen after info has been freed.
496
497 2010-02-09  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
498
499         PR fortran/42999
500         * array.c (gfc_constant_ac): Do not prevent expansion of constructors
501         with iterators.
502
503 2010-02-09  Jakub Jelinek  <jakub@redhat.com>
504
505         * module.c (fix_mio_expr): Declare sym.
506
507 2010-02-09  Paul Thomas  <pault@gcc.gnu.org>
508
509         PR fortran/41869
510         * module.c (fix_mio_expr): Fix for private generic procedures.
511
512 2010-02-09  Daniel Kraft  <d@domob.eu>
513
514         PR fortran/39171
515         * resolve.c (resolve_charlen): Change warning about negative CHARACTER
516         length to be correct and issue only with -Wsurprising.
517         * invoke.texi (Wsurprising): Mention this new warning that is
518         turned on by -Wsurprising.
519
520 2010-02-09  Daniel Kraft  <d@domob.eu>
521
522         PR fortran/41507
523         * intrinsic.texi (MAXVAL): Remove wrong claim that array argument
524         can be CHARACTER type.
525         (MINVAL), (MAXLOC), (MINLOC): Ditto.
526
527 2010-02-05  Paul Thomas  <pault@gcc.gnu.org>
528
529         PR fortran/42309
530         * trans-expr.c (gfc_conv_subref_array_arg): Add new argument
531         'formal_ptr'. If this is true, give returned descriptor unity
532         lbounds, in all dimensions, and the appropriate offset.
533         (gfc_conv_procedure_call); If formal is a pointer, set the last
534         argument of gfc_conv_subref_array_arg to true.
535         * trans.h : Add last argument for gfc_conv_subref_array_arg.
536         * trans-io.c (set_internal_unit, gfc_trans_transfer): Set the
537         new arg of gfc_conv_subref_array_arg to false.
538         * trans-stmt.c (forall_make_variable_temp): The same.
539
540 2010-02-03  Tobias Burnus  <burnus@net-b.de>
541
542         PR fortran/42936
543         * interface.c (compare_parameter): Disable rank-checking
544         for NULL().
545
546 2010-02-02  Tobias Burnus  <burnus@net-b.de>
547
548         PR fortran/42650
549         * parse.c (decode_specification_statement): Use sym->result not sym.
550
551 2010-02-01  Tobias Burnus  <burnus@net-b.de>
552
553         PR fortran/42922
554         * decl.c (variable_decl): Allow default initializer in
555         TYPE declarations in PURE functions.
556
557 2010-01-31  Janus Weil  <janus@gcc.gnu.org>
558
559         PR fortran/42888
560         * resolve.c (resolve_allocate_expr): Move default initialization code
561         here from gfc_trans_allocate.
562         * trans.c (gfc_trans_code): Call gfc_trans_class_assign also for
563         EXEC_INIT_ASSIGN.
564         * trans-expr.c (gfc_trans_class_assign): Handle default initialization
565         of CLASS variables via memcpy.
566         * trans-stmt.c (gfc_trans_allocate): Move default initialization code
567         to resolve_allocate_expr.
568
569 2010-01-31  Paul Thomas  <pault@gcc.gnu.org>
570
571         PR fortran/38324
572         * expr.c (gfc_get_full_arrayspec_from_expr): New function.
573         * gfortran.h : Add prototype for above.
574         * trans-expr.c (gfc_trans_alloc_subarray_assign): New function.
575         (gfc_trans_subcomponent_assign): Call new function to replace
576         the code to deal with allocatable components.
577         * trans-intrinsic.c (gfc_conv_intrinsic_bound): Call
578         gfc_get_full_arrayspec_from_expr to replace existing code.
579
580 2010-01-25  Tobias Burnus  <burnus@net-b.de>
581
582         PR fortran/42858
583         * array.c (gfc_array_dimen_size): Fix intrinsic procedure
584         check.
585
586 2010-01-24  Paul Thomas  <pault@gcc.gnu.org>
587
588         PR fortran/41044
589         PR fortran/41167
590         * expr.c (remove_subobject_ref): If the constructor is NULL use
591         the expression as the source.
592         (simplify_const_ref): Change the type of expression if
593         there are component references.  Allow for substring to be at
594         the end of an arbitrarily long chain of references.  If an
595         element is found that is not in an EXPR_ARRAY, assume that this
596         is scalar initialization of array. Call remove_subobject_ref in
597         this case with NULL second argument.
598
599 2010-01-24  Tobias Burnus  <burnus@net-b.de>
600
601         PR fortran/39304
602         * array.c (gfc_array_dimen_size): Use correct specific
603         function in the check.
604
605 2010-01-21  Paul Thomas  <pault@gcc.gnu.org>
606
607         PR fortran/42736
608         * trans-stmt.c (gfc_conv_elemental_dependencies): If temporary
609         is required, turn any trailing array elements after a range
610         into ranges so that offsets can be calculated.
611
612 2010-01-20  Joern Rennecke  <amylaar@spamcop.net>
613
614         * module.c (mio_f2k_derived): Use enumerator as initializer of
615         enum variable.
616
617         PR bootstrap/42812
618         * gfortran.h  (struct gfc_namespace) <resolved>: Change to signed
619         bitfield of width 2.
620
621 2010-01-19  Janus Weil  <janus@gcc.gnu.org>
622
623         PR fortran/42804
624         * resolve.c (extract_compcall_passed_object): Set locus for
625         passed-object argument.
626         (extract_ppc_passed_object): Set locus and correctly remove PPC
627         reference.
628
629 2010-01-19  Paul Thomas  <pault@gcc.gnu.org>
630
631         PR fortran/42783
632         * trans-decl.c (add_argument_checking): Do not use the backend
633         decl directly to test for the presence of an optional dummy
634         argument.  Use gfc_conv_expr_present, remembering to set the
635         symbol referenced.
636
637         PR fortran/42772
638         * trans-decl.c (gfc_generate_function_code): Small white space
639         changes. If 'recurcheckvar' is NULL do not try to reset it.
640
641 2010-01-19  Janus Weil  <janus@gcc.gnu.org>
642
643         PR fortran/42545
644         * resolve.c (resolve_fl_derived): Set the accessibility of the parent
645         component for extended types.
646         * symbol.c (gfc_find_component): Remove a wrongly-worded error message
647         and take care of parent component accessibility.
648
649 2010-01-17  Janus Weil  <janus@gcc.gnu.org>
650
651         PR fortran/42677
652         * gfortran.h (symbol_attribute): Remove 'ambiguous_interfaces'.
653         * interface.c (check_interface1): Move a warning message here from
654         resolve_fl_procedure.
655         (check_sym_interfaces): Removed 'attr.ambiguous_interfaces'.
656         * module.c (read_module): Remove call to gfc_check_interfaces, since
657         this comes too early here.
658         * resolve.c (resolve_fl_procedure): Move warning message to
659         check_interface1.
660
661 2010-01-14 Jerry DeLisle <jvdelisle@gcc.gnu.org>
662
663         PR fortran/42684
664         * interface.c (check_interface1): Pass symbol name rather than NULL to
665         gfc_compare_interfaces. (gfc_compare_interfaces): Add assert to
666         trap MULL.
667         * resolve.c (check_generic_tbp_ambiguity): Pass symbol name rather
668         than NULL to gfc_compare_interfaces.
669
670 2010-01-14  Paul Thomas  <pault@gcc.gnu.org>
671
672         PR fortran/41478
673         * trans-array.c (duplicate_allocatable):  Static version of
674         gfc_duplicate_allocatable with provision to handle scalar
675         components. New boolean argument to switch off call to malloc
676         if true.
677         (gfc_duplicate_allocatable): New function to call above with
678         new argument false.
679         (gfc_copy_allocatable_data): New function to call above with
680         new argument true.
681         (structure_alloc_comps): Do not apply indirect reference to
682         scalar pointers. Add new section to copy allocatable components
683         of arrays. Extend copying of allocatable components to include
684         scalars.
685         (gfc_copy_only_alloc_comp): New function to copy allocatable
686         component derived types, without allocating the base structure.
687         * trans-array.h : Add primitive for gfc_copy_allocatable_data.
688         Add primitive for gfc_copy_only_alloc_comp.
689         * trans-expr.c (gfc_conv_procedure_call): After calls to
690         transformational functions with results that are derived types
691         with allocatable components, copy the components in the result.
692         (gfc_trans_arrayfunc_assign): Deallocate allocatable components
693         of lhs derived types before allocation.
694         
695 2010-01-14  Paul Thomas  <pault@gcc.gnu.org>
696
697         PR fortran/42481
698         * module.c (load_generic_interfaces): If a procedure that is
699         use associated but not generic is given an interface that
700         includes itself, then make it generic.
701
702 2010-01-11  Joseph Myers  <joseph@codesourcery.com>  
703             Shujing Zhao  <pearly.zhao@oracle.com>
704
705         PR translation/42469
706         * lang.opt (fblas-matmul-limit=, finit-character=, finit-integer=,
707         finit-logical=, finit-real=, fmax-array-constructor=): Use tab
708         character between option name and help text.
709
710 2010-01-09 Jerry DeLisle <jvdelisle@gcc.gnu.org>
711
712         PR fortran/20923
713         PR fortran/32489
714         * trans-array.c (gfc_conv_array_initializer): Change call to
715         gfc_error_now to call to gfc_fatal_error.
716         * array.c (count_elements): Whitespace. (extract_element): Whitespace.
717         (is_constant_element): Changed name from constant_element.
718         (gfc_constant_ac): Only use expand_construuctor for expression
719         types of EXPR_ARRAY.  If expression type is EXPR_CONSTANT, no need to
720         call gfc_is_constant_expr.
721         * expr.c (gfc_reduce_init_expr): Adjust conditionals and delete error
722         message.
723         * resolve.c (gfc_is_expandable_expr): New function that determiners if
724         array expressions should have their constructors expanded.
725         (gfc_resolve_expr): Use new function to determine whether or not to call
726         gfc_expand_constructor.
727
728 2010-01-09  Tobias Burnus  <burnus@net-b.de>
729
730         PR fortran/41298
731         * trans-expr.c (gfc_trans_structure_assign): Handle
732         c_null_(fun)ptr.
733         * symbol.c (gen_special_c_interop_ptr): Add NULL_EXPR
734         to the constructor for c_null_(fun)ptr.
735         * resolve.c (resolve_structure_cons): Add special case
736         for c_null_(fun)ptr.
737
738 2010-01-09  Jakub Jelinek  <jakub@redhat.com>
739
740         * gfortranspec.c (lang_specific_driver): Update copyright notice
741         dates.
742
743 2010-01-08  Tobias Burnus  <burnus@net-b.de>
744
745         PR/fortran 25829
746         * symbol.c (check_conflict, gfc_copy_attr): Add
747         ASYNCHRONOUS support.
748         (gfc_add_asynchronous): New function.
749         * decl.c (match_attr_spec): Add ASYNCHRONOUS support.
750         (gfc_match_asynchronous): New function.
751         * dump-parse-tree.c (show_attr): Add ASYNCHRONOUS support.
752         * gfortran.h (symbol_attribute): New ASYNCHRONOUS bit.
753         (gfc_add_asynchronous): New Prototype.
754         * module.c (ab_attribute, mio_symbol_attribute): Add
755         ASYNCHRONOUS support.
756         * resolve.c (was_declared): Ditto.
757         * match.h (gfc_match_asynchronous): New prototype.
758         * parse.c (decode_specification_statement,decode_statement):
759         Add ASYNCHRONOUS support.
760
761 2010-01-07  Tobias Burnus  <burnus@net-b.de>
762
763         PR fortran/42597
764         * trans-decl.c (get_proc_pointer_decl): Fix call to
765         gfc_conv_initializer for array-valued proc-pointer funcs.
766
767 2010-01-07  Tobias Burnus  <burnus@net-b.de>
768
769         PR fortran/41872
770         * trans-decl.c (gfc_trans_deferred_vars): Don't initialize
771         allocatable scalars with SAVE attribute.
772
773 2010-01-05  Tobias Burnus  <burnus@net-b.de>
774
775         PR fortran/42517
776         * options.c (gfc_post_options): Set -frecursion
777         when -fopenmp is used.
778
779 2010-01-05  Tobias Burnus  <burnus@net-b.de>
780
781         PR fortran/41872
782         * trans-expr.c (gfc_conv_procedure_call): Nullify
783         return value for allocatable-scalar character functions.
784
785 2010-01-04  Tobias Burnus  <burnus@net-b.de>
786
787         PR fortran/36161
788         * error.c (error_printf, gfc_warning, gfc_notify_std,
789         gfc_warning_now, gfc_error, gfc_error_now,
790         gfc_fatal_error): Change argument name from nocmsgid to
791         gmsgid to enable (x)gettext's % checking.
792
793 2010-01-04  Tobias Burnus  <burnus@net-b.de>
794         
795         * trans-decl.c (gfc_trans_deferred_vars): Fix spelling.
796
797 2010-01-04  Tobias Burnus  <burnus@net-b.de>
798
799         PR fortran/41872
800         * trans-expr.c (gfc_conv_procedure_call): Add indirect ref
801         for functions returning allocatable scalars.
802         * trans-stmt.c (gfc_trans_allocate): Emmit error when
803         reallocating an allocatable scalar.
804         * trans.c (gfc_allocate_with_status): Fix pseudocode syntax
805         in comment.
806         * trans-decl.c (gfc_trans_deferred_vars): Nullify local
807         allocatable scalars.
808         (gfc_generate_function_code): Nullify result variable for
809         allocatable scalars.
810         
811         PR fortran/40849
812         * module.c (gfc_use_module): Fix warning string to allow
813         for translation.
814
815         PR fortran/42517
816         * invoke.texi (-fcheck=recursion): Mention that the checking
817         is also disabled for -frecursive.
818         * trans-decl.c (gfc_generate_function_code): Disable
819         -fcheck=recursion when -frecursive is used.
820
821         * intrinsic.texi (iso_c_binding): Improve wording.
822
823 \f
824 Copyright (C) 2010 Free Software Foundation, Inc.
825
826 Copying and distribution of this file, with or without modification,
827 are permitted in any medium without royalty provided the copyright
828 notice and this notice are preserved.