* trans-array.c: Fix a comment typo.
[official-gcc.git] / gcc / fortran / ChangeLog
blob0431572c5a66d6d70cf27a044294043b23c5aac5
1 2007-02-03  Kazu Hirata  <kazu@codesourcery.com>
3         * trans-array.c: Fix a comment typo.
5 2007-02-03  Paul Thomas  <pault@gcc.gnu.org>
7         PR fortran/30514
8         * array.c (match_array_element_spec): If the length of an array is
9         negative, adjust the upper limit to make it zero length.
11         PR fortran/30660
12         * resolve.c (pure_function, resolve_function): Initialize name to
13         null to clear up build warnings.
14         (resolve_fl_variable): Look at components explicitly to check for
15         default initializer, rather than using gfc_default_initializer.
17 2007-02-02  Steven G. Kargl <kargl@gcc.gnu.org>
19         PR fortran/30683
20         * resolve.c (resolve_generic_f): Check for non-NULL sym.
22 2007-02-02  Roger Sayle  <roger@eyesopen.com>
24         * trans.c (gfc_build_array_ref): Use STRIP_TYPE_NOPS to eliminate
25         NON_LVALUE_EXPR nodes and useless type conversions.
27 2007-02-02  Paul Thomas  <pault@gcc.gnu.org>
29         PR fortran/30284
30         PR fortran/30626
31         * trans-expr.c (gfc_conv_aliased_arg): Remove static attribute
32         from function and make sure that substring lengths are
33         translated.
34         (is_aliased_array): Remove static attribute.
35         * trans.c : Add prototypes for gfc_conv_aliased_arg and
36         is_aliased_array.
37         * trans-io.c (set_internal_unit): Add the post block to the
38         arguments of the function.  Use is_aliased_array to check if
39         temporary is needed; if so call gfc_conv_aliased_arg.
40         (build_dt): Pass the post block to set_internal_unit and
41         add to the block after all io activiy is done.
43 2007-02-01  Roger Sayle  <roger@eyesopen.com>
45         * trans-array.c (gfc_conv_expr_descriptor): We don't need to use
46         a temporary array to pass a constant non-character array constructor.
47         Generalize the descriptor generation code to handle scalarizer
48         "info" without an array reference.
50 2007-02-01  Roger Sayle  <roger@eyesopen.com>
52         * dependency.c (gfc_check_dependency) <EXPR_ARRAY>: Implement
53         dependency checking for array constructors.
55 2007-02-01  Roger Sayle  <roger@eyesopen.com>
57         * trans-stmt.c (compute_overall_iter_number): Document function
58         arguments.  Generalize "unconditional forall nest with constant
59         bounds" optimization to eliminate unconditional inner loops with
60         constant bounds.
62 2007-01-31  Tobias Burnus  <burnus@net-b.de>
64         PR fortran/30520
65         * interface.c (compare_actual_formal): Check conformance between
66           actual and VOLATILE dummy arguments.
67         * symbol.c (gfc_add_volatile): Allow setting of VOLATILE
68           multiple times in different scopes.
69         * decl.c (gfc_match_volatile): Search symbol in host association.
71 2007-01-31  Kazu Hirata  <kazu@codesourcery.com>
73         * simplify.c, trans-array.c: Fix comment typos.
75 2007-01-30  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
77         * invoke.texi (Code Gen Options): Fix abbreviation typo.
78         * intrinsic.texi (ACCESS, LSHIFT, RSHIFT): Fix typos.
80 2007-01-30  Steve Ellcey  <sje@cup.hp.com>
82         PR fortran/30432
83         * trans-types.c (gfc_get_function_type):  Do not add void_type_node
84         to empty arg list.
85         * trans-decl.c (create_function_arglist): Change assert.
87 2007-01-29  Paul Thomas  <pault@gcc.gnu.org>
89         PR fortran/30554
90         * module.c (read_module): If a symbol is excluded by an ONLY
91         clause, check to see if there is a symtree already loaded. If
92         so, attach the symtree to the pointer_info.
94 2007-01-28  Thomas Koenig  <Thomas.Koenig@online.de>
96         PR libfortran/30389
97         * gfortran.h:  Remove gfc_simplify_init_1.
98         * arith.h:  Remove third argument from gfc_compare_string.
99         * arith.c(gfc_compare_expression):  Remove third argument
100         from call to gfc_compare_string.
101         (gfc_compare_string):  Remove third argument xcoll_table.
102         Remove use of xcoll_table.
103         * misc.c(gfc_init_1):  Remove call to gfc_simplify_init_1.
104         * simplify.c(ascii_table):  Remove.
105         (xascii_table): Likewise.
106         (gfc_simplify_achar):  ICE if extract_int fails.  Remove use of
107         ascii_table.  Warn if -Wsurprising and value < 0 or > 127.
108         (gfc_simplify_char):  ICE if extract_int fails. Error if
109         value < 0 or value > 255.
110         (gfc_simplify_iachar):  Remove use of xascii_table.
111         Char values outside of 0..255 are an ICE.
112         (gfc_simplify_lge):  Remove use of xascii_table.
113         (gfc_simplify_lgt):  Likewise.
114         (gfc_simplify_lle):  Likewise.
115         (gfc_simplify_llt):  Likewise.
116         (invert_table):  Remove.
117         (gfc_simplify_init_1):  Remove.
119 2007-01-27  Roger Sayle  <roger@eyesopen.com>
121         * trans-stmt.c (forall_info): Replace the next_nest and outer
122         fields that previously implemented a doubly-linked list with a
123         single prev_nest field (singly-linked list).
124         (gfc_trans_nested_forall_loop): The nested_forall_info argument
125         now denotes the innermost FORALL in the loop nest.
126         (compute_overall_iter_number): Use prev_nest instead of next_nest.
127         (gfc_trans_forall_1): Link/cons the new "info" to the head of the
128         nested_forall_info linked list.  Free the current "info" when done.
130 2007-01-27  Paul Thomas  <pault@gcc.gnu.org>
132         PR fortran/30407
133         * trans-expr.c (gfc_conv_operator_assign): New function.
134         * trans.h : Add prototype for gfc_conv_operator_assign.
135         * trans-stmt.c (gfc_trans_where_assign): Add a gfc_symbol for
136         a potential operator assignment subroutine.  If it is non-NULL
137         call gfc_conv_operator_assign instead of the first assignment.
138         ( gfc_trans_where_2): In the case of an operator assignment,
139         extract the argument expressions from the code for the
140         subroutine call and pass the symbol to gfc_trans_where_assign.
141         resolve.c (resolve_where, gfc_resolve_where_code_in_forall,
142         gfc_resolve_forall_body): Resolve the subroutine call for
143         operator assignments.
145 2007-01-26  Steven Bosscher  <stevenb.gcc@gmail.com>
146             Steven G. Kargl <kargl@gcc.gnu.org>
148         PR fortran/30278
149         * fortran/io.c (next_char): Deal with backslash escaped characters.
150         Issue warnings in non -std=gnu cases.
151         * fortran/primary.c (next_string_char): Issue warnings in non
153 2007-01-26  Tobias Burnus  <burnus@net-b.de>
155         * lang-specs.h: Add support for .f03 and .F03 extensions.
156         * gfortran.texi: Document .f03 extension.
157         * options.c (form_from_filename): Recognize .f03.
159 2007-01-25  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
161         PR fortran/30437
162         * lang.opt (Wall): Remove RejectNegative.
163         * options.c (gfc_handle_option): Wall can be disabled.
164         (set_Wall): Add a parameter for disabling Wall.
165         
166 2007-01-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
168         PR fortran/30532
169         * scanner.c (load_line): Remove check fot ctrl-z and don't gobble.
170         
171 2007-01-23  Paul Thomas  <pault@gcc.gnu.org>
173         PR fortran/30481
174         * match.c (gfc_match_namelist): Add check for assumed size character
175         in namelist and provide error if found.
177 2007-01-21  Brooks Moses  <brooks.moses@codesourcery.com>
179         * intrinsic.texi (ACHAR): Added cross-references.
180         (CHAR): Put cross-references in alphabetical order.
181         (IACHAR): Added cross-references.
182         (ICHAR): Added cross-references.
184 2007-01-20  Brooks Moses  <brooks.moses@codesourcery.com>
186         * intrinsic.texi: Edited all "Syntax" examples to a consistent form.
187         (MAXVAL): Corrected description of result characteristics.
188         (MINVAL): Same.
189         (UMASK): Added documentation.
191 2007-01-20  Steven G. Kargl  <kargl@gcc.gnu.org>
193         * openmp.c, matchexp.c, module.c, scanner.c, resolve.c, st.c,
194         parse.c, primary.c, options.c, misc.c, simplify.c:  Next installment
195         in the massive whitespace patch.
197 2007-01-20  Roger Sayle  <roger@eyesopen.com>
199         * module.c (mio_array_ref): The dimen_type fields of an array ref
200         are an enumerated type and can't be read/written directly with a
201         call to mio_integer.  Instead loop over and cast each element.
203 2007-01-20  Roger Sayle  <roger@eyesopen.com>
205         * dependency.c (gfc_full_array_ref_p): Check that ref->next is NULL,
206         i.e. that the ARRAY_REF doesn't mention components.
207         * trans-array.c (gfc_constant_array_constructor_p): Export external
208         function renamed from constant_array_constructor_p.
209         (gfc_build_constant_array_constructor): Export.
210         (gfc_trans_array_constructor): Update call to the renamed function
211         constant_array_constructor_p.
212         * trans-array.h (gfc_constant_array_constructor_p): Prototype here.
213         (gfc_build_constant_array_constructor): Likewise.
214         * trans-expr.c (gfc_build_memcpy_call): New helper function split
215         out from gfc_trans_array_copy.
216         (gfc_trans_array_copy): Use gfc_build_memcpy_call.
217         (gfc_trans_array_constructor_copy): New function to optimize
218         assigning an entire array from a constant array constructor.
219         (gfc_trans_assignment): Call gfc_trans_array_constructor_copy
220         when appropriate.
222 2007-01-20  Roger Sayle  <roger@eyesopen.com>
224         * trans-intrinsic.c (gfc_conv_intrinsic_sign): New branchless
225         implementation for the SIGN intrinsic with integral operands.
226         (gfc_conv_intrinsic_minmax): Fix whitespace.
228 2007-01-20  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
230         * gfortran.h (gfc_options_t): Add flag_allow_leading_underscore.
231         * lang.opt: Add -fallow-leading-underscore.
232         * match.c (gfc_match_name): Allow leading underscore in symbol
233         name if -fallow-leading-underscore is used.
234         * symbol.c (gfc_get_default_type): Add special case for symbol
235         names beginning with an underscore.
236         * trans-decl.c (gfc_get_extern_function_decl,
237         gfc_build_intrinsic_function_decls): Add _gfortran prefix to
238         library symbols selected_int_kind, selected_real_kind and 
239         all specifics.
240         * options.c (gfc_init_options, gfc_handle_option): Handle the
241         new -fallow-leading-underscore option.
243 2007-01-20  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
245         PR fortran/30446
246         * options.c (gfc_handle_module_path_options): Path used in -J
247         option is now added to the module search path.
249 2007-01-20  Richard Guenther  <rguenther@suse.de>
251         PR fortran/30223
252         * f95-lang.c (gfc_init_builtin_functions): Provide cbrt and
253         cexpi builtins if we have TARGET_C99_FUNCTIONS.  Provide
254         sincos builtins if the target has sincos.
256 2007-01-19  Brooks Moses  <brooks.moses@codesourcery.com>
258         * intrinsic.texi (MATMUL): Corrected a typo.
259         (MAX): Separated @var arguments.
260         (MIN): Separated @var arguments.
262 2007-01-19  Brooks Moses  <brooks.moses@codesourcery.com>
264         * intrinsic.texi: general whitespace cleanup.
265         (menu): Added TIME8, removed UNMASK.
266         (AINT): Clarified argument requirement.
267         (ANINT): Clarified argument requirement.
268         (CEILING): Clarified argument requirement.
269         (CHAR): Clarified argument requirement.
270         (CMPLX): Clarified argument requirement.
271         (DCMPLX): Clarified argument requirement.
272         (FGET): Line rewrapping.
273         (FLOOR): Clarified argument requirement.
274         (GMTIME): Added documentation.
275         (IAND): Added cross-reference.
276         (IBCLR): Added cross-reference.
277         (IBSET): Added cross-reference.
278         (IEOR): Added cross-reference.
279         (INT): Collapsed examples, clarified argument requirement.
280         (IOR): Added cross-references.
281         (LEN_TRIM): Corrected result kind.
282         (LINK): Added cross-reference.
283         (LLT): Removed "documentation pending".
284         (LOGICAL): Added documentation.
285         (LSHIFT): Added documentation.
286         (LTIME): Added documentation.
287         (MATMUL): Added documentation.
288         (MAX): Added documentation.
289         (MAXLOC): Added documentation.
290         (MAXVAL): Added documentation.
291         (MERGE): Added documentation.
292         (MIN): Added documentation.
293         (MINLOC): Added documentation.
294         (MINVAL): Added documentation.
295         (MVBITS): Moved to correct place, added documentation.
296         (NOT): Added documentation.
297         (PERROR): Added documentation.
298         (RAN): Moved to correct place, added documentation.
299         (REAL): Clarified argument requirement.
300         (RENAME): Added documentation.
301         (RSHIFT): Clarified argument requirement.
302         (SIGN): Corrected table specification.
303         (SYMLNK): Added documentation.
304         (SYSTEM): Added documentation.
305         (TIME): Added documentation.
306         (TIME8): Added section and documentation.
307         (UNMASK): Removed erroneous section.
309 2007-01-18  H.J. Lu  <hongjiu.lu@intel.com>
311         * trans-stmt.c (compute_overall_iter_number): Fix a typo.
313 2007-01-18  Roger Sayle  <roger@eyesopen.com>
315         * trans-expr.c (copyable_array_p): Consider user derived types without
316         allocatable components to be copyable.
318 2007-01-18  Roger Sayle  <roger@eyesopen.com>
320         * trans-stmt.c (compute_overall_iter_number): Enhance to precompute
321         the number of interations in unconditional FORALL nests with constant
322         bounds.
324 2007-01-18  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
325             Tobias Burnus  <burnus@net-b.de>
327         PR libfortran/29649
328         * gfortran.h (gfc_option_t): Add flag_dump_core.
329         * lang.opt: Add -fdump-core option.
330         * invoke.texi: Document the new options.
331         * trans-decl.c (gfc_build_builtin_function_decls): Add new
332           options to the call to set_std.
333         * options.c (gfc_init_options, gfc_handle_option): Set the
334           new options.
336 2007-01-17  Paul Thomas  <pault@gcc.gnu.org>
338         PR fortran/30476
339         * module.c (load_generic_interfaces): Make the marking of the
340         symbol as ambiguous conditional on the module names being
341         different.
342         (write_generic): Ensure that the generic interface has a
343         non-NULL module field.
345 2007-01-16  Roger Sayle  <roger@eyesopen.com>
347         PR fortran/30404
348         * trans-stmt.c (forall_info): Remove pmask field.
349         (gfc_trans_forall_loop): Remove NVAR argument, instead assume that
350         NVAR covers all the interation variables in the current forall_info.
351         Add an extra OUTER parameter, which specified the loop header in
352         which to place mask index initializations.
353         (gfc_trans_nested_forall_loop): Remove NEST_FLAG argument.
354         Change the semantics of MASK_FLAG to only control the mask in the
355         innermost loop.
356         (compute_overall_iter_number): Optimize the trivial case of a
357         top-level loop having a constant number of iterations.  Update
358         call to gfc_trans_nested_forall_loop.  Calculate the number of
359         times the inner loop will be executed, not to size of the 
360         iteration space.
361         (allocate_temp_for_forall_nest_1): Reuse SIZE as BYTESIZE when
362         sizeof(type) == 1.  Tidy up.
363         (gfc_trans_assign_need_temp): Remove NEST_FLAG argument from calls
364         to gfc_trans_nested_forall_loop.
365         (gfc_trans_pointer_assign_need_temp): Likewise.
366         (gfc_trans_forall_1): Remove unused BYTESIZE, TMPVAR, SIZEVAR and
367         LENVAR local variables.  Split mask allocation into a separate
368         hunk/pass from mask population.  Use allocate_temp_for_forall_nest
369         to allocate the FORALL mask with the correct size.  Update calls
370         to gfc_trans_nested_forall_loop.
371         (gfc_evaluate_where_mask): Update call to
372         gfc_trans_nested_forall_loop.
373         (gfc_trans_where_2): Likewise.
375 2007-01-15  Paul Thomas  <pault@gcc.gnu.org>
377         PR fortran/28172
378         * trans-stmt.c (gfc_trans_call): If it does not have one, get
379         a backend_decl for an alternate return.
381         PR fortran/29389
382         * resolve.c (pure_function): Statement functions are pure. Note
383         that this will have to recurse to comply fully with F95.
385         PR fortran/29712
386         * resolve.c (resolve_function): Only a reference to the final
387         dimension of an assumed size array is an error in an inquiry
388         function.
390         PR fortran/30283
391         * resolve.c (resolve_function): Make sure that the function
392         expression has a type.
394 2007-01-14  Paul Thomas  <pault@gcc.gnu.org>
396         PR fortran/30410
397         * trans-decl.c (gfc_sym_mangled_function_id): Module, external
398         symbols must not have the module name prepended.
400 2007-01-11  Thomas Koenig  <Thomas.Koenig@online.de>
402         PR libfortran/30415
403         * iresolve.c (gfc_resolve_maxloc):  If the rank
404         of the return array is nonzero and we process an
405         integer array smaller than default kind, coerce
406         the array to default integer.
407         * iresolve.c (gfc_resolve_minloc):  Likewise.
409 2007-01-11  Brooks Moses  <brooks.moses@codesourcery.com>
411         * simplify.c: Update copyright to 2007.
412         * scanner.c: Same.
414 2007-01-11  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
416         PR fortran/30430
417         * scanner.c (gfc_release_include_path): Free gfc_option.module_dir
418         only once!
420 2007-01-09  Brooks Moses  <brooks.moses@codesourcery.com>
422         * simplify.c (gfc_simplify_ibclr): Fix POS comparison.
423         (gfc_simplify_ibset): Same.
425 2007-01-09  Brooks Moses  <brooks.moses@codesourcery.com>
427         PR 30381
428         PR 30420
429         * simplify.c (convert_mpz_to_unsigned): New function.
430         (convert_mpz_to_signed): New function, largely based on
431         twos_complement().
432         (twos_complement): Removed.
433         (gfc_simplify_ibclr): Add conversions to and from an
434         unsigned representation before bit-twiddling.
435         (gfc_simplify_ibset): Same.
436         (gfc_simplify_ishftc): Add checks for overly large
437         constant arguments, only check the third argument if
438         it's present, carry over high bits into the result as
439         appropriate, and perform the final conversion back to
440         a signed representation using the correct sign bit.
441         (gfc_simplify_not): Removed unnecessary masking.
443 2007-01-09  Paul Thomas  <pault@gcc.gnu.org>
445         PR fortran/30408
446         * resolve.c (resolve_code): Use the code->expr character length
447         directly to set length of llen.
449 2007-01-09  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
451         PR fortran/30408
452         * lang.opt: Add Wcharacter_truncation option.
453         * options.c (gfc_init_options): Initialize
454         gfc_option.warn_character_truncation to zero.
455         (gfc_handle_option): Add case for OPT_Wcharacter_truncation.
457 2007-01-08  Steven G. Kargl  <kargl@gcc.gnu.org>
459         * interface.c, intrinsic.c, gfortranspec.c, io.c, f95-lang.c,
460         iresolve.c, match.c:  Update Copyright years.  Whitespace.
462 2007-01-08  Richard Guenther  <rguenther@suse.de>
464         * trans-io.c (transfer_array_desc): Use build_int_cst instead
465         of build_int_cstu.
467 2007-01-08  Roger Sayle  <roger@eyesopen.com>
469         * trans-array.c (constant_array_constructor_p): New function to
470         determine whether an array constructor consists only of constant
471         elements, and if so return it's size.
472         (gfc_build_constant_array_constructor): Construct a statically
473         initialized gfortran array for a given EXPR_ARRAY.
474         (gfc_trans_constant_array_constructor): Efficiently scalarize
475         a constant array constructor.
476         (gfc_trans_array_constructor):  Tidy up use of CONST_STRING.
477         Special case scalarization of constant array constructors, all of
478         whose elements are specified, using constant_array_constructor_p 
479         and gfc_trans_constant_array_constructor.
480         (gfc_conv_scalarized_array_ref): Check whetger info->offset is zero
481         before adding it to index, to avoid creating a NON_LVALUE_EXPR.
483 2007-01-08  Kazu Hirata  <kazu@codesourcery.com>
485         gfortran.texi: Fix typos.
487 2007-01-07  Steven G. Kargl  <kargl@gcc.gnu.org>
489         * decl.c, dump-parse-tree.c, error.c, data.c, expr.c, dependency.c,
490         convert.c:  Update Copyright dates.  Fix whitespace.
492 2007-01-07  Bernhard Fischer  <aldot@gcc.gnu.org>
494         * data.c (gfc_assign_data_value): Fix whitespace.
496 2007-01-07  Bernhard Fischer  <aldot@gcc.gnu.org>
498         * trans-array.c (gfc_trans_create_temp_array, gfc_array_init_size):
499         Commentary typo fix.
501 2007-01-07  Bernhard Fischer  <aldot@gcc.gnu.org>
503         PR fortran/27698
504         * match.c (gfc_match_name): Print diagnostics for invalid
505         character in names.
507 2007-01-06  Steven G. Kargl  <kargl@gcc.gnu.org>
509         * array.c: Fix whitespace in comment table.
511 2007-01-06  Steven G. Kargl  <kargl@gcc.gnu.org>
513         * array.c, bbt.c, check.c:  Update copyright years.  Whitespace.
515 2007-01-06  Steven G. Kargl  <kargl@gcc.gnu.org>
517         * arith.c: Update copyright years.  Whitespace.
519 2007-01-05  Roger Sayle  <roger@eyesopen.com>
521         * trans-expr.c (gfc_trans_assignment_1): New subroutine to scalarize
522         array assignments split out from gfc_trans_assignment.
523         (gfc_trans_array_copy): New function to implement array to array
524         copies via calls to __builtin_memcpy.
525         (copyable_array_p): New helper function to identify an array of
526         simple/POD types, that may be copied/assigned using memcpy.
527         (gfc_trans_assignment): Use gfc_trans_array_copy to handle simple
528         whole array assignments considered suitable by copyable_array_p.
529         Invoke gfc_trans_assignment_1 to perform the fallback scalarization.
531 2007-01-05  Roger Sayle  <roger@eyesopen.com>
533         * trans-array.c (gfc_trans_array_constructor_value): Make the
534         static const "data" array as TREE_READONLY.
535         * trans-stmt.c (gfc_trans_character_select): Likewise.
537 2007-01-05  Roger Sayle  <roger@eyesopen.com>
539         * trans-array.c (gfc_conv_loop_setup):  Test whether the loop
540         stride is one, to avoid fold_build2 introducing a useless
541         NON_LVALUE_EXPR node.
543 2007-01-05  Tobias Burnus  <burnus@net-b.de>
545         * symbol.c (check_conflict): Fix error message.
547 2007-01-05  Paul Thomas  <pault@gcc.gnu.org>
549         PR fortran/23232
550         * decl.c (gfc_in_match_data, gfc_set_in_match_data): New
551         functions to signal that a DATA statement is being matched.
552         (gfc_match_data): Call gfc_set_in_match_data on entry and on
553         exit.
554         * gfortran.h : Add prototypes for above.
555         * expr.c (check_init_expr): Avoid check on parameter or
556         variable if gfc_in_match_data is true.
557         (gfc_match_init_expr): Do not call error on non-reduction of
558         expression if gfc_in_match_data is true.
560         PR fortran/27996
561         PR fortran/27998
562         * decl.c (gfc_set_constant_character_len): Add boolean arg to
563         flag array constructor resolution.  Warn if string is being
564         truncated.  Standard dependent error if string is padded. Set
565         new arg to false for all three calls to
566         gfc_set_constant_character_len.
567         * match.h : Add boolean arg to prototype for
568         gfc_set_constant_character_len.
569         * gfortran.h : Add warn_character_truncation to gfc_options.
570         * options.c (set_Wall): Set warn_character_truncation if -Wall
571         is set.
572         * resolve.c (resolve_code): Warn if rhs string in character
573         assignment has to be truncated.
574         * array.c (gfc_resolve_character_array_constructor): Set new
575         argument to true for call to gfc_set_constant_character_len.
577 2007-01-05  Tobias Burnus  <burnus@net-b.de>
579         PR fortran/29624
580         * interface.c (compare_parameter_intent): New function.
581           (check_intents): Support pointer intents.
582         * symbol.c (check_conflict): Support pointer intents,
583           better conflict_std message.
584         * expr.c (gfc_check_assign,gfc_check_pointer_assign):
585           Support pointer intents.
586         * resolve.c (resolve_deallocate_expr,resolve_allocate_expr):
587           Support pointer intents.
589 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
591         PR 30371
592         * check.c (gfc_check_kill_sub): Add checks for non-scalar
593         arguments.
595 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
597         * intrinsic.texi: Minor cleanup, reflowing overlong
598         paragraphs, and correcting whitespace.
600 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
602         * intrinsic.texi (LBOUND): Add documentation.
603         (LGE): Add documentation.
604         (LGT): Add documentation.
605         (LINK): Add documentation.
606         (LLE): Add documentation.
607         (LLT): Add documentation.
608         (LNBLNK): Add documentation.
609         (UBOUND): Add documentation.
610         (UNLINK): Add documentation.
612 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
614         * intrinsic.texi (IAND): Clarify argument specifications.
615         (IBCLR): Add documentation.
616         (IBITS): Add documentation.
617         (IBSET): Add documentation.
618         (IEOR): Add documentation.
619         (IERRNO): Add documentation.
620         (INDEX): Add documentation.
621         (IOR): Add documentation.
622         (ISHFT): Add documentation.
623         (ISHFTC): Add documentation.
624         (KILL): Add documentation.
625         (LEN_TRIM): Add documentation.
627 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
629         PR 30235
630         * interface.c (compare_actual_formal): check for
631         alternate returns when iterating over non-present
632         arguments.
634 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
636         * invoke.texi: Update manpage copyright to include 2007.
638 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
640         * gfortran.texi: Update copyright to include 2007.
641         * intrinsic.texi: Update copyright to include 2007.
642         * invoke.texi: Update copyright to include 2007.
644 2007-01-02  Tobias Burnus  <burnus@net-b.de>
645             Jakub Jelinek  <jakub@redhat.com>
647         PR fortran/30276
648         * scanner.c (open_included_file): Revert patch.
649           (gfc_open_included_file): Support absolute pathnames.
650           (gfc_open_intrinsic_module): Support absolute pathnames.
652 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
654         * gfortran.texi (GNU Fortran and GCC): Rewrite
656 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
658         * gfortran.texi (Introduction): Lower "Part I:
659         Introduction" to a chapter, renumber Parts II and III to
660         Parts I and II.
661         * intrinsic.texi (Introduction): Rename to "Introduction
662         to Intrinsics" to avoid conflict with the new chapter.
664 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
666         * intrinsic.texi (Introduction): Rewrite first paragraph.
668 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
670         * invoke.texi (OpenMP): Added index entry.
671         * gfortran.texi (title page): Removed erroneous '*'.
673 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
675         * gfortran.texi (GFORTRAN_DEFAULT_RECL): Added units
676         to description.
677         (Extensions): Miscellaneous minor rewriting and copyediting.
678         (BOZ-literal constants): Renamed from Hexadecimal constants.
679         (Hollerith constants support): Added explanation and 
680         suggestions for standard-conforming modern equivalents.
682 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
684         * intrinsic.texi: Improvements to index entries; change
685         @findex entries to @cindex entries.
686         * invoke.texi: Standardize and improve index entries.
687         * gfortran.texi: Fix @code in one index entry.
689 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
691         * invoke.texi: Change @code-type macros to appropriate
692         variants (@command, @option, etc.)
693         * gfortran.texi: Same.
695 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
697         * intrinsic.texi: Various minor cleanups.
699 2007-01-02  Steven G. Kargl  <kargls@comcast.net>
701         * trans-intrinsic.c (gfc_conv_intrinsic_ibits): Fix call to
702         build_int_cst.
704 2007-01-02  Tobias Burnus  <burnus@net-b.de>
706         PR fortran/30276
707         * scanner.c (open_included_file): Support full-path filenames.
709 2007-01-02  Paul Thomas  <pault@gcc.gnu.org>
711         PR fortran/20896
712         * interface.c (check_sym_interfaces): Remove call to
713         resolve_global_procedure.
714         gfortran.h : Remove prototype for resolve_global_procedure.
715         resolve.c (resolve_global_procedure): Add static attribute
716         to function declaration.
718 2007-01-01  Steven G. Kargl  <kargls@comcast.net>
720         * ChangeLog: Copy to ...
721         * ChangeLog-2006: here.