Searched refs:str (Results 1 - 25 of 1935) sorted by relevance

1234567891011>>

/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/
H A Dbackspace_11.f905 character(len=5) :: str variable in program:backspace_11
11 read(10,'(A)',end=1) str
16 read(10,*,end=2) str
21 read(10,'(A)',end=3) str
H A Dtransfer_check_2.f906 character(len=10) :: str variable in program:main
8 str = transfer(65+66*2**8+67*2**16+68*2**24,str) ! { dg-warning "has partly undefined result" }
9 write (*,*) str(1:4)
11 str = transfer(i,str) ! { dg-warning "has partly undefined result" }
12 write (*,*) str(1:4)
13 str = transfer(i,str(1:4))
14 write (*,*) str(
[all...]
H A Dfmt_f0_1.f906 CHARACTER(80) :: str variable
8 write (str,'(f0.0)') x
9 if (str.ne."0.") call abort
10 write (str,'(f0.1)') x
11 if (str.ne.".0") call abort
12 write (str,'(f0.2)') x
13 if (str.ne.".00") call abort
14 write (str,'(f0.3)') x
15 if (str.ne.".000") call abort
16 write (str,'(f
[all...]
H A Dwrite_check.f907 character(len=5) :: str variable in program:test
8 str = 'yes'
9 write(*,'(a)',advance=str) ''
10 str = 'no'
11 write(*,'(a)',advance=str) ''
12 str = 'NOT'
13 write(*,'(a)',advance=str) ''
H A Dwrite_padding.f902 ! PR25264 Verify that the internal unit, str, is not cleared
7 character(len=10) :: str variable in program:write_padding
9 str = '123'
10 write( str, '(a3,i1)' ) trim(str),4
11 if (str.ne."1234") call abort()
H A Dadvance_1.f906 character(10) :: str variable in program:pr25463
10 read (10, '(a)') str
11 if (str.ne.'abc') call abort()
H A Dassumed_charlen_arg_2.f907 SUBROUTINE SUB1( str )
9 CHARACTER(len=*) :: str(2) local in subroutine:SUB1
10 CALL SUB2( str(1)(:3) )
13 SUBROUTINE SUB2( str )
15 CHARACTER(*) :: str local in subroutine:SUB2
H A Dbounds_check_strlen_1.f908 SUBROUTINE test (str)
10 CHARACTER(len=5) :: str local in subroutine:test
18 ! { dg-output "shorter than the declared one for dummy argument 'str' \\(3/5\\)" }
H A Dfmt_error_4.f9012 CHARACTER(len=32), PARAMETER :: str = "hello" local in subroutine:format_runtime
14 PRINT fmtstr, str, str, str
H A Dnested_array_constructor_3.f9014 SUBROUTINE sub(str)
16 CHARACTER(LEN=*) :: str(2) local in subroutine:sub
17 WRITE (*,*) str
19 IF (str(1) /= 'ac' .OR. str(2) /= 'ac') THEN
H A Dallocatable_scalar_8.f9011 function func() result (str)
12 character(len=3), allocatable :: str local in function:func
13 if (allocated (str)) call abort ()
14 allocate (str)
15 str = 'abc'
H A Dreal_const_3.f908 character(len=80) str variable in program:main
18 write(str,*) a
19 if (trim(adjustl(str)) .ne. 'Infinity') call abort
23 write(str,*) -1.0/b
24 if (trim(adjustl(str)) .ne. '-Infinity') call abort
26 write(str,*) b/0.0
27 if (trim(adjustl(str)) .ne. 'NaN') call abort
29 write(str,*) 0.0/0.0
30 if (trim(adjustl(str)) .ne. 'NaN') call abort
32 write(str,*) 1.
[all...]
H A Dinit_flag_9.f908 character(len=n) :: str local in subroutine:foo
9 ! print *, str
10 if (str /= repeat ('Y', n)) call abort()
H A Dio_real_boz2.f909 character(len=100) :: str variable in program:real_boz
12 write(str,'(o0)') r
/haiku-buildtools/gcc/gcc/testsuite/gcc.dg/tree-ssa/
H A Dpr42327.c4 void foo(char *str) argument
6 while (*str != 0) *str++ = 0;
/haiku-buildtools/gcc/gcc/testsuite/gcc.target/i386/
H A Dpr63538.c6 static char *str = "Hello World"; variable
10 return str;
/haiku-buildtools/gcc/gcc/testsuite/gcc.target/avr/
H A Dprogmem-error-1.c5 char str[] PROGMEM = "Hallo"; /* { dg-error "must be const" } */
H A Dprogmem-error-1.cpp5 char str[] PROGMEM = "Hallo"; /* { dg-error "must be const" "" { target avr-*-* } 1 } */
/haiku-buildtools/gcc/gcc/testsuite/g++.dg/charset/
H A Dextern3.cc9 char str[]="abcdefghijklmnopqrstuvwxyz"; local
10 bar = str;
H A Dfunction.cc5 const char *str; variable
9 str = __FUNCTION__;
/haiku-buildtools/gcc/gcc/testsuite/g++.dg/conversion/
H A Dconst1.C3 void f(char *str) { argument
4 char *& m = const_cast<char *>(str); // { dg-error "" }
/haiku-buildtools/gcc/gcc/testsuite/gcc.dg/
H A Darray-6.c8 struct str { int len; char s[]; }; struct
10 struct str a = { 2, "a" };
14 static struct str b = { 2, "b" };
15 struct str c = { 2, "c" }; /* { dg-error "(non-static)|(near initialization)" } */
16 struct str d = (struct str) { 2, "d" }; /* { dg-error "(non-static)|(near initialization)" } */
17 struct str e = (struct str) { d.len, "e" }; /* { dg-error "(non-static)|(initialization)" } */
/haiku-buildtools/gcc/gcc/testsuite/gcc.dg/charset/
H A Dextern.c9 char str[]="abcdefghijklmnopqrstuvwxyz"; local
10 bar = str;
H A Dfunction.c5 const char *str; variable
9 str = __FUNCTION__;
/haiku-buildtools/gcc/gcc/testsuite/gcc.c-torture/compile/
H A D20010525-1.c2 static int kind_varread(char *str) argument
4 if (0 == memcmp("%_#", str, 3)) return 2;

Completed in 116 milliseconds

1234567891011>>