Searched refs:ndim (Results 1 - 16 of 16) sorted by relevance

/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/
H A Dpr41229.f907 ndim = SIZE(a,2)
8 ALLOCATE(tau(ndim),STAT=istat)
9 ALLOCATE(work(2*ndim),STAT=istat)
H A Dpr30667.f4 subroutine cblank_cvb(a,ndim)
8 do 100 i=1,ndim
H A Darray_constructor_49.f907 integer :: ndim=2, ndfp=4, i variable in program:t
9 write (unit=line,fmt='(4I2)'), (/ ( i, i = 1, ndfp ) /) + ndim
H A Dderived_comp_array_ref_1.f9024 integer, parameter :: ndim = 4 variable
26 logical :: used_(ndim)
28 allocate (outputs_(ndim))
29 forall (i = 1:ndim) outputs_(i)%signal_number = ndim + 1 - i
32 if (any (outputs_(ndim:1:-1)%used .neqv. used_)) call abort ()
H A Dcoarray_args_2.f9010 integer, parameter :: ndim = 2 variable in module:mod_rank_mismatch_02
35 real :: a(ndim,2)[*]
42 call subr(ndim, a(1:1,2)) ! OK
43 call subr(ndim, a(1,2)) ! { dg-error "must be simply contiguous" }
H A Dpr42166.f906 SUBROUTINE newuob (n, bmat, ndim, d, vlag, w, npt)
7 REAL(dp), DIMENSION(ndim, *), INTENT(inout) :: bmat
H A Dpr49721-1.f7 parameter (ndim=3)
10 dimension vr(ndim2,ndim2),vi(ndim2,ndim2),s1(ndim2,ndim2),p(ndim)
/haiku-buildtools/gcc/gcc/testsuite/gcc.dg/
H A Dpr63762.c17 MaskF (int inside, int ndim, const int lbnd[], const int ubnd[], argument
26 lbndg = astMalloc (sizeof (int)*(size_t) ndim);
27 ubndg = astMalloc (sizeof (int)*(size_t) ndim);
28 lbndgd = astMalloc (sizeof (double)*(size_t) ndim);
29 ubndgd = astMalloc (sizeof (double)*(size_t) ndim);
35 for (idim = 0; idim < ndim; idim++)
70 result += astResampleF (used_region, ndim, lbnd, ubnd, in, NULL,
71 NULL, NULL, 0, 0.0, 100, val, ndim,
/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/graphite/
H A Dpr42181.f907 xopt,xnew,xpt,fval,gq,hq,pq,bmat,zmat,ndim,d,vlag,w,opt)
/haiku-buildtools/legacy/gcc/gcc/
H A Dgenattrtab.c3613 int i, j, total, ndim = 0;
3617 if (! find_and_mark_used_attributes (exp, &list, &ndim) || ndim == 0)
3629 space = (struct dimension *) alloca (ndim * sizeof (struct dimension));
3632 for (ndim = 0; list; ndim++)
3639 if ((space[ndim].attr = find_attr (name, 0)) == 0
3640 || space[ndim].attr->is_numeric)
3642 unmark_used_attributes (list, space, ndim);
3647 space[ndim]
3587 int i, j, total, ndim = 0; local
[all...]
/haiku-buildtools/legacy/gcc/gcc/java/
H A Dverify.c1047 int ndim, i; local
1049 ndim = IMMEDIATE_u1;
1051 if( ndim < 1 )
1054 for( i = 0; i < ndim; i++ )
H A Dexpr.c825 expand_java_multianewarray (class_type, ndim)
827 int ndim;
832 for( i = 0; i < ndim; i++ )
840 build_int_2 (ndim, 0), args )),
/haiku-buildtools/gcc/gcc/ada/gcc-interface/
H A Ddecl.c2001 const int ndim = Number_Dimensions (gnat_entity);
2005 tree *gnu_index_types = XALLOCAVEC (tree, ndim);
2006 tree *gnu_temp_fields = XALLOCAVEC (tree, ndim);
2097 for (index = (convention_fortran_p ? ndim - 1 : 0),
2099 0 <= index && index < ndim;
2189 for (index = 0; index < ndim; index++)
2216 for (index = ndim - 1; index >= 0; index--)
2326 const int ndim = Number_Dimensions (gnat_entity);
2328 tree *gnu_index_types = XALLOCAVEC (tree, ndim);
2335 for (index = (convention_fortran_p ? ndim
2000 const int ndim = Number_Dimensions (gnat_entity); local
2325 const int ndim = Number_Dimensions (gnat_entity); local
[all...]
H A Dtrans.c2047 int ndim;
2050 for (ndim = 1, gnu_type_temp = gnu_type;
2053 ndim++, gnu_type_temp = TREE_TYPE (gnu_type_temp))
2056 Dimension = ndim + 1 - Dimension;
5783 int ndim;
5815 for (ndim = 1, gnu_type = TREE_TYPE (gnu_array_object);
5818 ndim++, gnu_type = TREE_TYPE (gnu_type))
5821 gnat_expr_array = XALLOCAVEC (Node_Id, ndim);
5824 for (i = ndim - 1, gnat_temp = First (Expressions (gnat_node));
5830 i < ndim;
2041 int ndim; local
5765 int ndim; local
[all...]
/haiku-buildtools/gcc/gcc/java/
H A Dexpr.c1110 expand_java_multianewarray (tree class_type, int ndim)
1115 vec_safe_grow (args, 3 + ndim);
1118 (*args)[1] = build_int_cst (NULL_TREE, ndim);
1120 for(i = ndim - 1; i >= 0; i-- )
1123 (*args)[2 + ndim] = null_pointer_node;
1108 expand_java_multianewarray(tree class_type, int ndim) argument
/haiku-buildtools/gcc/gcc/fortran/
H A Dtrans-array.c6802 int dim, ndim, codim; local
6810 ndim = info->ref ? info->ref->u.ar.dimen : ss->dimen;
6820 gcc_assert (ar->dimen_type[n + ndim] == DIMEN_THIS_IMAGE);
6824 gcc_assert (ar->stride[n + ndim] == NULL);
6826 gfc_conv_section_startstride (&loop.pre, ss, n + ndim);
6827 loop.from[n + loop.dimen] = info->start[n + ndim];
6828 loop.to[n + loop.dimen] = info->end[n + ndim];
6833 info->descriptor, n + ndim, true);
6834 loop.from[n + loop.dimen] = info->start[n + ndim];
6886 for (n = 0; n < ndim;
[all...]

Completed in 307 milliseconds