OSDN Git Service

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