/external/llvm/test/CodeGen/X86/ |
D | abi-isel.ll | 2 …ion-model=static -code-model=small -pre-RA-sched=list-ilp | FileCheck %s -check-prefix=LINUX-32-PIC 5 …cation-model=pic -code-model=small -pre-RA-sched=list-ilp | FileCheck %s -check-prefix=LINUX-64-PIC 9 …ation-model=pic -code-model=small -pre-RA-sched=list-ilp | FileCheck %s -check-prefix=DARWIN-32-PIC 13 …ation-model=pic -code-model=small -pre-RA-sched=list-ilp | FileCheck %s -check-prefix=DARWIN-64-PIC 50 ; LINUX-32-PIC-LABEL: foo00: 51 ; LINUX-32-PIC: movl src, [[EAX:%e.x]] 52 ; LINUX-32-PIC-NEXT: movl [[EAX]], dst 53 ; LINUX-32-PIC-NEXT: ret 55 ; LINUX-64-PIC-LABEL: foo00: 56 ; LINUX-64-PIC: movq src@GOTPCREL(%rip), [[RAX:%r..]] [all …]
|
D | rodata-relocs.ll | 2 ; RUN: llc < %s -relocation-model=pic | FileCheck %s -check-prefix=PIC 29 ; PIC: .section .rodata.cst8,"aM",@progbits,8 30 ; PIC: a: 31 ; PIC: a1: 32 ; PIC: .section .rodata.cst16,"aM",@progbits,16 33 ; PIC: e: 34 ; PIC: e1: 35 ; PIC: .section .data.rel.ro.local,"aw",@progbits 36 ; PIC: p: 37 ; PIC: t: [all …]
|
D | asm-modifier-P.ll | 1 … -mtriple=i686-unknown-linux-gnu -relocation-model=pic | FileCheck %s -check-prefix=CHECK-PIC-32 4 ; RUN: llc < %s -march=x86-64 -relocation-model=pic | FileCheck %s -check-prefix=CHECK-PIC-64 24 ; CHECK-PIC-64-LABEL: test1: 25 ; CHECK-PIC-64: movq G@GOTPCREL(%rip), %rax 26 ; CHECK-PIC-64: frob (%rax) x 27 ; CHECK-PIC-64: frob (%rax) x 33 ; CHECK-PIC-32-LABEL: test1: 34 ; CHECK-PIC-32: frob G x 35 ; CHECK-PIC-32: frob G x 60 ; CHECK-PIC-64-LABEL: test3: [all …]
|
D | tls-models.ll | 27 ; Non-PIC code can use initial-exec, PIC code has to use general dynamic. 44 ; Non-PIC code can use local exec, PIC code can use local dynamic. 64 ; Non-PIC code can use initial exec, PIC code use local dynamic as specified. 81 ; Non-PIC code can use local exec, PIC code can use local dynamic. 101 ; Non-PIC and PIC code will use initial exec as specified. 118 ; Non-PIC code can use local exec, PIC code use initial exec as specified. 138 ; Non-PIC and PIC code will use local exec as specified. 155 ; Non-PIC and PIC code will use local exec as specified.
|
/external/llvm/test/MC/PowerPC/ |
D | ppc64-initial-cfa.s | 4 # RUN: llvm-readobj -s -sr -sd | FileCheck %s -check-prefix=PIC -check-prefix=PIC-BE 8 # RUN: llvm-readobj -s -sr -sd | FileCheck %s -check-prefix=PIC -check-prefix=PIC-LE 56 # PIC: Section { 57 # PIC: Name: .eh_frame 58 # PIC-NEXT: Type: SHT_PROGBITS 59 # PIC-NEXT: Flags [ (0x2) 60 # PIC-NEXT: SHF_ALLOC 61 # PIC-NEXT: ] 62 # PIC-NEXT: Address: 63 # PIC-NEXT: Offset: [all …]
|
/external/llvm/test/CodeGen/Mips/ |
D | tls-models.ll | 1 ; RUN: llc -march=mipsel < %s | FileCheck -check-prefix=CHECK-PIC %s 22 ; Non-PIC code can use initial-exec, PIC code has to use general dynamic. 25 ; CHECK-PIC-LABEL: f1: 26 ; CHECK-PIC: %tlsgd 33 ; Non-PIC code can use local exec, PIC code can use local dynamic. 36 ; CHECK-PIC-LABEL: f2: 37 ; CHECK-PIC: %tlsldm 47 ; Non-PIC code can use initial exec, PIC should use local dynamic. 50 ; CHECK-PIC-LABEL: f3: 51 ; CHECK-PIC: %tlsldm [all …]
|
D | mno-ldc1-sdc1.ll | 13 ; RUN: -check-prefix=32R1-LE -check-prefix=32R1-LE-PIC 17 ; RUN: -check-prefix=32R2-LE -check-prefix=32R2-LE-PIC 21 ; RUN: -check-prefix=32R6-LE -check-prefix=32R6-LE-PIC 27 ; RUN: -check-prefix=32R1-BE -check-prefix=32R1-BE-PIC 31 ; RUN: -check-prefix=32R2-BE -check-prefix=32R2-BE-PIC 35 ; RUN: -check-prefix=32R6-BE -check-prefix=32R6-BE-PIC 55 ; 32R1-LE-PIC-DAG: lw $[[R0:[0-9]+]], 0(${{[0-9]+}}) 56 ; 32R1-LE-PIC-DAG: lw $[[R1:[0-9]+]], 4(${{[0-9]+}}) 57 ; 32R1-LE-PIC-DAG: mtc1 $[[R0]], $f0 58 ; 32R1-LE-PIC-DAG: mtc1 $[[R1]], $f1 [all …]
|
D | s2rem.ll | 1 …l-linux-gnu -march=mipsel -mcpu=mips16 -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC 16 ; PIC: .ent it 18 ; PIC: save $16, $17, $ra, [[FS:[0-9]+]] 20 ; PIC: restore $16, $17, $ra, [[FS]] 22 ; PIC: .end it 34 ; PIC: .ent ft 35 ; PIC: save $16, $17, $ra, $18, [[FS:[0-9]+]] 36 ; PIC: restore $16, $17, $ra, $18, [[FS]] 37 ; PIC: .end ft 48 ; PIC: .ent dt [all …]
|
D | tls.ll | 2 ; RUN: FileCheck %s -check-prefix=PIC -check-prefix=CHECK 16 ; PIC-LABEL: f1: 17 ; PIC-DAG: addu $[[R0:[a-z0-9]+]], $2, $25 18 ; PIC-DAG: lw $25, %call16(__tls_get_addr)($[[R0]]) 19 ; PIC-DAG: addiu $4, $[[R0]], %tlsgd(t1) 20 ; PIC-DAG: jalr $25 21 ; PIC-DAG: lw $2, 0($2) 39 ; PIC-LABEL: f2: 40 ; PIC-DAG: addu $[[R0:[a-z0-9]+]], $2, $25 41 ; PIC-DAG: lw $25, %call16(__tls_get_addr)($[[R0]]) [all …]
|
D | start-asm-file.ll | 13 ; RUN: FileCheck -check-prefix=CHECK-PIC-O32 -check-prefix=CHECK-PIC-O32-NLEGACY %s 21 ; RUN: FileCheck -check-prefix=CHECK-PIC-O32 -check-prefix=CHECK-PIC-O32-N2008 %s 30 ; RUN: FileCheck -check-prefix=CHECK-PIC-N32 -check-prefix=CHECK-PIC-N32-NLEGACY %s 38 ; RUN: FileCheck -check-prefix=CHECK-PIC-N32 -check-prefix=CHECK-PIC-N32-N2008 %s 47 ; RUN: FileCheck -check-prefix=CHECK-PIC-N64 -check-prefix=CHECK-PIC-N64-NLEGACY %s 55 ; RUN: FileCheck -check-prefix=CHECK-PIC-N64 -check-prefix=CHECK-PIC-N64-N2008 %s 63 ; CHECK-PIC-O32: .abicalls 64 ; CHECK-PIC-O32-NOT: .option pic0 65 ; CHECK-PIC-O32: .section .mdebug.abi32 66 ; CHECK-PIC-O32-NLEGACY: .nan legacy [all …]
|
D | 2010-07-20-Switch.ll | 4 ; RUN: FileCheck %s -check-prefix=PIC-O32 23 ; PIC-O32: sll $[[R0:[0-9]+]], ${{[0-9]+}}, 2 24 ; PIC-O32: lw $[[R1:[0-9]+]], %got($JTI0_0) 25 ; PIC-O32: addu $[[R2:[0-9]+]], $[[R0]], $[[R1]] 26 ; PIC-O32: lw $[[R4:[0-9]+]], %lo($JTI0_0)($[[R2]]) 27 ; PIC-O32: addu $[[R5:[0-9]+]], $[[R4:[0-9]+]] 28 ; PIC-O32: jr $[[R5]] 64 ; PIC-O32: .align 2 65 ; PIC-O32: $JTI0_0: 66 ; PIC-O32: .gpword [all …]
|
D | global-address.ll | 1 ; RUN: llc -march=mipsel -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC-O32 3 …64el -mcpu=mips64r2 -mattr=-n64,n32 -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC-N32 5 …64el -mcpu=mips64r2 -mattr=-n64,n64 -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC-N64 13 ; PIC-O32: lw $[[R0:[0-9]+]], %got(s1) 14 ; PIC-O32: lw ${{[0-9]+}}, %lo(s1)($[[R0]]) 15 ; PIC-O32: lw ${{[0-9]+}}, %got(g1) 21 ; PIC-N32: lw $[[R0:[0-9]+]], %got_page(s1) 22 ; PIC-N32: lw ${{[0-9]+}}, %got_ofst(s1)($[[R0]]) 23 ; PIC-N32: lw ${{[0-9]+}}, %got_disp(g1) 29 ; PIC-N64: ld $[[R0:[0-9]+]], %got_page(s1) [all …]
|
D | blockaddr.ll | 1 ; RUN: llc -march=mipsel -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC-O32 3 …64el -mcpu=mips64r2 -mattr=-n64,n32 -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC-N32 5 …64el -mcpu=mips64r2 -mattr=-n64,n64 -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC-N64 17 ; PIC-O32: lw $[[R0:[0-9]+]], %got($tmp[[T0:[0-9]+]]) 18 ; PIC-O32: addiu ${{[0-9]+}}, $[[R0]], %lo($tmp[[T0]]) 19 ; PIC-O32: lw $[[R1:[0-9]+]], %got($tmp[[T1:[0-9]+]]) 20 ; PIC-O32: addiu ${{[0-9]+}}, $[[R1]], %lo($tmp[[T1]]) 25 ; PIC-N32: lw $[[R0:[0-9]+]], %got_page($tmp[[T0:[0-9]+]]) 26 ; PIC-N32: addiu ${{[0-9]+}}, $[[R0]], %got_ofst($tmp[[T0]]) 27 ; PIC-N32: lw $[[R1:[0-9]+]], %got_page($tmp[[T1:[0-9]+]]) [all …]
|
D | 2009-11-16-CstPoolLoad.ll | 1 ; RUN: llc -march=mipsel -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC-O32 3 …64el -mcpu=mips64r2 -mattr=-n64,n32 -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC-N32 5 …64el -mcpu=mips64r2 -mattr=-n64,n64 -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC-N64 10 ; PIC-O32: lw $[[R0:[0-9]+]], %got($CPI0_0) 11 ; PIC-O32: lwc1 $f0, %lo($CPI0_0)($[[R0]]) 14 ; PIC-N32: lw $[[R0:[0-9]+]], %got_page($CPI0_0) 15 ; PIC-N32: lwc1 $f0, %got_ofst($CPI0_0)($[[R0]]) 18 ; PIC-N64: ld $[[R0:[0-9]+]], %got_page($CPI0_0) 19 ; PIC-N64: lwc1 $f0, %got_ofst($CPI0_0)($[[R0]])
|
/external/llvm/test/CodeGen/ARM/ |
D | tls-models.ll | 2 …ch=arm -mtriple=arm-linux-gnueabi -relocation-model=pic < %s | FileCheck -check-prefix=CHECK-PIC %s 23 ; Non-PIC code can use initial-exec, PIC code has to use general dynamic. 26 ; CHECK-PIC-LABEL: f1: 27 ; CHECK-PIC: external_gd(TLSGD) 34 ; Non-PIC code can use local exec, PIC code can use local dynamic, 38 ; CHECK-PIC-LABEL: f2: 39 ; CHECK-PIC: internal_gd(TLSGD) 49 ; Non-PIC code can use initial exec, PIC should use local dynamic, 53 ; CHECK-PIC-LABEL: f3: 54 ; CHECK-PIC: external_ld(TLSGD) [all …]
|
D | eh-dispcont.ll | 1 …UN: llc -mtriple armv7-apple-ios -relocation-model=pic -o - %s | FileCheck %s -check-prefix=ARM-PIC 4 …lc -mtriple thumbv6-apple-ios -relocation-model=pic -o - %s | FileCheck %s -check-prefix=THUMB1-PIC 44 ; ARM-PIC: cxa_throw 45 ; ARM-PIC: trap 46 ; ARM-PIC: adr [[REG1:r[0-9]+]], [[LJTI:.*]] 47 ; ARM-PIC: ldr [[REG0:r[0-9]+]], [r{{[0-9]+}}, [[REG1]]] 48 ; ARM-PIC: add pc, [[REG0]], [[REG1]] 49 ; ARM-PIC: [[LJTI]] 50 ; ARM-PIC: .data_region jt32 51 ; ARM-PIC: .long [[LABEL:LBB0_[0-9]]]-[[LJTI]] [all …]
|
D | cse-ldrlit.ll | 1 …mbv6m-apple-none-macho -relocation-model=pic -o - %s | FileCheck %s --check-prefix=CHECK-THUMB-PIC 2 …ple=arm-apple-none-macho -relocation-model=pic -o - %s | FileCheck %s --check-prefix=CHECK-ARM-PIC 22 ; CHECK-THUMB-PIC-LABEL: foo: 23 ; CHECK-THUMB-PIC: ldr r0, LCPI0_0 24 ; CHECK-THUMB-PIC: LPC0_0: 25 ; CHECK-THUMB-PIC-NEXT: add r0, pc 26 ; CHECK-THUMB-PIC: ldr {{r[1-9][0-9]?}}, [r0, #4] 28 ; CHECK-THUMB-PIC: LCPI0_0: 29 ; CHECK-THUMB-PIC-NEXT: .long _var-(LPC0_0+4) 30 ; CHECK-THUMB-PIC-NOT: LCPI0_1 [all …]
|
/external/llvm/test/CodeGen/Thumb2/ |
D | tls2.ll | 1 ; RUN: llc < %s -mtriple=thumbv7-linux-gnueabi | FileCheck %s -check-prefix=CHECK-NOT-PIC 2 …lc < %s -mtriple=thumbv7-linux-gnueabi -relocation-model=pic | FileCheck %s -check-prefix=CHECK-PIC 8 ; CHECK-NOT-PIC-LABEL: f: 9 ; CHECK-NOT-PIC: add r0, pc 10 ; CHECK-NOT-PIC: ldr r1, [r0] 11 ; CHECK-NOT-PIC: i(GOTTPOFF) 13 ; CHECK-PIC-LABEL: f: 14 ; CHECK-PIC: bl __tls_get_addr(PLT) 21 ; CHECK-NOT-PIC-LABEL: g: 22 ; CHECK-NOT-PIC: add r0, pc [all …]
|
/external/llvm/test/CodeGen/PowerPC/ |
D | available-externally.ll | 2 ; RUN: llc < %s -relocation-model=pic | FileCheck %s -check-prefix=PIC 17 ; PIC: _foo: 18 ; PIC: bl L_exact_log2$stub 19 ; PIC: blr 43 ; PIC: .section __TEXT,__picsymbolstub1,symbol_stubs,pure_instructions,32 44 ; PIC: L_exact_log2$stub: 45 ; PIC: .indirect_symbol _exact_log2 46 ; PIC: mflr r0 47 ; PIC: bcl 20, 31, L_exact_log2$stub$tmp 49 ; PIC: L_exact_log2$stub$tmp: [all …]
|
D | indirectbr.ll | 1 …s -relocation-model=pic -march=ppc32 -mtriple=powerpc-apple-darwin | FileCheck %s -check-prefix=PIC 9 ; PIC-LABEL: foo: 19 ; PIC: mtctr 20 ; PIC-NEXT: li 21 ; PIC-NEXT: li 22 ; PIC-NEXT: li 23 ; PIC-NEXT: li 24 ; PIC-NEXT: bctr 62 ; PIC: li r[[R1:[0-9]+]], lo16(Ltmp0-L0$pb) 63 ; PIC: addis r[[R0:[0-9]+]], r{{[0-9]+}}, ha16(Ltmp0-L0$pb) [all …]
|
/external/llvm/test/CodeGen/AArch64/ |
D | jump-table.ll | 3 …rs -relocation-model=pic -aarch64-atomic-cfg-tidy=0 -o - %s | FileCheck --check-prefix=CHECK-PIC %s 26 ; CHECK-PIC: adrp [[JTPAGE:x[0-9]+]], .LJTI0_0 27 ; CHECK-PIC: add x[[JT:[0-9]+]], [[JTPAGE]], {{#?}}:lo12:.LJTI0_0 28 ; CHECK-PIC: ldrsw [[DEST:x[0-9]+]], [x[[JT]], {{x[0-9]+}}, lsl #2] 29 ; CHECK-PIC: add [[TABLE:x[0-9]+]], [[DEST]], x[[JT]] 30 ; CHECK-PIC: br [[TABLE]] 58 ; CHECK-PIC-NOT: .data_region 59 ; CHECK-PIC: .LJTI0_0: 60 ; CHECK-PIC-NEXT: .word 61 ; CHECK-PIC-NEXT: .word [all …]
|
D | arm64-elf-globals.ll | 3 …arm64-linux-gnu -relocation-model=pic -o - %s -mcpu=cyclone | FileCheck %s --check-prefix=CHECK-PIC 4 …ux-gnu -O0 -relocation-model=pic -o - %s -mcpu=cyclone | FileCheck %s --check-prefix=CHECK-FAST-PIC 20 ; CHECK-PIC-LABEL: test_i8: 21 ; CHECK-PIC: adrp x[[HIREG:[0-9]+]], :got:var8 22 ; CHECK-PIC: ldr x[[VAR_ADDR:[0-9]+]], [x[[HIREG]], :got_lo12:var8] 23 ; CHECK-PIC: ldrb {{w[0-9]+}}, [x[[VAR_ADDR]]] 28 ; CHECK-FAST-PIC: adrp x[[HIREG:[0-9]+]], :got:var8 29 ; CHECK-FAST-PIC: ldr x[[VARADDR:[0-9]+]], [x[[HIREG]], :got_lo12:var8] 30 ; CHECK-FAST-PIC: ldr {{w[0-9]+}}, [x[[VARADDR]]] 90 ; CHECK-PIC: adrp {{x[0-9]+}}, hiddenvar [all …]
|
/external/llvm/test/CodeGen/SPARC/ |
D | obj-relocs.ll | 2 …9 -filetype=obj --relocation-model=pic | llvm-readobj -r | FileCheck %s --check-prefix=CHECK-PIC 11 ; CHECK-PIC: Relocations [ 12 ; CHECK-PIC: 0x{{[0-9,A-F]+}} R_SPARC_PC22 _GLOBAL_OFFSET_TABLE_ 0x4 13 ; CHECK-PIC: 0x{{[0-9,A-F]+}} R_SPARC_PC10 _GLOBAL_OFFSET_TABLE_ 0x8 14 ; CHECK-PIC: 0x{{[0-9,A-F]+}} R_SPARC_GOT22 AGlobalVar 0x0 15 ; CHECK-PIC: 0x{{[0-9,A-F]+}} R_SPARC_GOT10 AGlobalVar 0x0 16 ; CHECK-PIC: 0x{{[0-9,A-F]+}} R_SPARC_WPLT30 bar 0x0 17 ; CHECK-PIC: ]
|
/external/chromium_org/third_party/mesa/src/ |
D | acinclude.m4 | 6 # Find out whether to build PIC code using the option --enable-pic and 7 # the configure enable_static/enable_shared settings. If PIC is needed, 17 AC_ARG_VAR([PIC_FLAGS], [compiler flags for PIC code]) 20 [compile PIC objects @<:@default=enabled for shared builds 25 # disable PIC by default for static builds 29 # if PIC hasn't been explicitly disabled, try to figure out the flags 31 AC_MSG_CHECKING([for $CC option to produce PIC]) 38 # PIC is the default for these OSes. 47 # PIC is the default on this platform 52 # PIC is the default for IA64 HP-UX and 64-bit HP-UX, [all …]
|
/external/mesa3d/ |
D | acinclude.m4 | 6 # Find out whether to build PIC code using the option --enable-pic and 7 # the configure enable_static/enable_shared settings. If PIC is needed, 17 AC_ARG_VAR([PIC_FLAGS], [compiler flags for PIC code]) 20 [compile PIC objects @<:@default=enabled for shared builds 25 # disable PIC by default for static builds 29 # if PIC hasn't been explicitly disabled, try to figure out the flags 31 AC_MSG_CHECKING([for $CC option to produce PIC]) 38 # PIC is the default for these OSes. 47 # PIC is the default on this platform 52 # PIC is the default for IA64 HP-UX and 64-bit HP-UX, [all …]
|