/external/swiftshader/third_party/LLVM/test/CodeGen/X86/ |
D | abi-isel.ll | 2 …gnu -march=x86 -relocation-model=static -code-model=small | FileCheck %s -check-prefix=LINUX-32-PIC 5 …gnu -march=x86-64 -relocation-model=pic -code-model=small | FileCheck %s -check-prefix=LINUX-64-PIC 9 …arwin -march=x86 -relocation-model=pic -code-model=small | FileCheck %s -check-prefix=DARWIN-32-PIC 13 …in -march=x86-64 -relocation-model=pic -code-model=small | FileCheck %s -check-prefix=DARWIN-64-PIC 50 ; LINUX-32-PIC: 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: foo00: 56 ; LINUX-64-PIC: movq src@GOTPCREL(%rip), [[RAX:%r..]] [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: 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: test1: 34 ; CHECK-PIC-32: frob G x 35 ; CHECK-PIC-32: frob G x 60 ; CHECK-PIC-64: test3: [all …]
|
/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,"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 …]
|
/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/ARM/ |
D | darwin-tls.ll | 1 …UN: llc -mtriple=thumbv7s-apple-ios7.0 -o - -fast-isel %s | FileCheck %s --check-prefix=T2-MOVT-PIC 2 …llc -mtriple=thumbv7s-apple-ios7.0 -o - %s -mattr=+no-movt | FileCheck %s --check-prefix=T2-LIT-PIC 5 ; RUN: llc -mtriple=armv7s-apple-ios7.0 -o - %s | FileCheck %s --check-prefix=ARM-MOVT-PIC 6 … llc -mtriple=armv7s-apple-ios7.0 -o - %s -mattr=+no-movt | FileCheck %s --check-prefix=ARM-LIT-PIC 17 ; T2-MOVT-PIC-LABEL: test_local_tls: 18 ; T2-MOVT-PIC: movw r0, :lower16:(_local_tls_var-([[PCREL_LOC:LPC[0-9]+_[0-9]+]]+4)) 19 ; T2-MOVT-PIC: movt r0, :upper16:(_local_tls_var-([[PCREL_LOC]]+4)) 20 ; T2-MOVT-PIC: [[PCREL_LOC]]: 21 ; T2-MOVT-PIC-NEXT: add r0, pc 22 ; T2-MOVT-PIC: ldr [[TLV_GET_ADDR:r[0-9]+]], [r0] [all …]
|
D | stack_guard_remat.ll | 1 … %s -mtriple=arm-apple-ios -relocation-model=pic -no-integrated-as | FileCheck %s -check-prefix=PIC 2 …-relocation-model=static -no-integrated-as | FileCheck %s -check-prefix=NO-PIC -check-prefix=STATIC 3 …=dynamic-no-pic -no-integrated-as | FileCheck %s -check-prefix=NO-PIC -check-prefix=DYNAMIC-NO-PIC 4 …ple-ios -mcpu=cortex-a8 -relocation-model=pic -no-integrated-as | FileCheck %s -check-prefix=PIC-V7 6 …8 -relocation-model=dynamic-no-pic -no-integrated-as | FileCheck %s -check-prefix=DYNAMIC-NO-PIC-V7 8 ;PIC: foo2 9 ;PIC: ldr [[R0:r[0-9]+]], [[LABEL0:LCPI[0-9_]+]] 10 ;PIC: [[LABEL1:LPC0_1]]: 11 ;PIC: add [[R1:r[0-9]+]], pc, [[R0]] 12 ;PIC: ldr [[R2:r[0-9]+]], {{\[}}[[R1]]{{\]}} [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 | tls-models.ll | 4 ; RUN: | FileCheck -check-prefix=CHECK-PIC -check-prefix=COMMON %s 30 ; Non-PIC code can use initial-exec, PIC code has to use general dynamic. 32 ; CHECK-PIC: external_gd(TLSGD) 41 ; Non-PIC code can use local exec, PIC code can use local dynamic, 44 ; CHECK-PIC: internal_gd(TLSGD) 56 ; Non-PIC code can use initial exec, PIC should use local dynamic, 59 ; CHECK-PIC: external_ld(TLSGD) 68 ; Non-PIC code can use local exec, PIC code can use local dynamic, 71 ; CHECK-PIC: internal_ld(TLSGD) 83 ; Non-PIC and PIC code will use initial exec as specified. [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/Mips/ |
D | mno-ldc1-sdc1.ll | 16 ; RUN: FileCheck %s -check-prefixes=ALL,32R1,32R1-LE,32R1-LE-PIC 19 ; RUN: FileCheck %s -check-prefixes=ALL,32R2,32R2-LE,32R2-LE-PIC 22 ; RUN: FileCheck %s -check-prefixes=ALL,32R6,32R6-LE,32R6-LE-PIC 25 ; RUN: FileCheck %s -check-prefixes=ALL,MM-MNO-PIC,MM-MNO-LE-PIC 28 ; RUN: FileCheck %s -check-prefixes=ALL,MM-MNO-PIC,MM-MNO-LE-PIC 33 ; RUN: FileCheck %s -check-prefixes=ALL,32R1,32R1-BE,32R1-BE-PIC 36 ; RUN: FileCheck %s -check-prefixes=ALL,32R2,32R2-BE,32R2-BE-PIC 39 ; RUN: FileCheck %s -check-prefixes=ALL,32R6,32R6-BE,32R6-BE-PIC 42 ; RUN: FileCheck %s -check-prefixes=ALL,MM-MNO-PIC,MM-MNO-BE-PIC 45 ; RUN: FileCheck %s -check-prefixes=ALL,MM-MNO-PIC,MM-MNO-BE-PIC [all …]
|
D | tls-models.ll | 1 ; RUN: llc -march=mipsel -relocation-model=pic < %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 | s2rem.ll | 1 …-linux-gnu -march=mipsel -mattr=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 | start-asm-file.ll | 10 ; RUN: FileCheck -check-prefixes=CHECK-PIC-O32,CHECK-PIC-O32-NLEGACY %s 18 ; RUN: FileCheck -check-prefixes=CHECK-PIC-O32,CHECK-PIC-O32-N2008 %s 27 ; RUN: FileCheck -check-prefixes=CHECK-PIC-N32,CHECK-PIC-N32-NLEGACY %s 35 ; RUN: FileCheck -check-prefixes=CHECK-PIC-N32,CHECK-PIC-N32-N2008 %s 44 ; RUN: FileCheck -check-prefixes=CHECK-PIC-N64,CHECK-PIC-N64-NLEGACY %s 52 ; RUN: FileCheck -check-prefixes=CHECK-PIC-N64,CHECK-PIC-N64-N2008 %s 60 ; CHECK-PIC-O32: .abicalls 61 ; CHECK-PIC-O32-NOT: .option pic0 62 ; CHECK-PIC-O32: .section .mdebug.abi32 63 ; CHECK-PIC-O32-NLEGACY: .nan legacy [all …]
|
D | tls.ll | 2 ; RUN: FileCheck %s -check-prefixes=PIC,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 …]
|
/external/swiftshader/third_party/LLVM/test/CodeGen/PowerPC/ |
D | available-externally.ll | 2 ; RUN: llc < %s -relocation-model=pic | FileCheck %s -check-prefix=PIC 15 ; PIC: _foo: 16 ; PIC: bl L_exact_log2$stub 17 ; PIC: blr 33 ; PIC: .section __TEXT,__picsymbolstub1,symbol_stubs,pure_instructions,32 34 ; PIC: L_exact_log2$stub: 35 ; PIC: .indirect_symbol _exact_log2 36 ; PIC: mflr r0 37 ; PIC: bcl 20,31,L_exact_log2$stub$tmp 39 ; PIC: L_exact_log2$stub$tmp: [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 21 ; CHECK-NOT-PIC-LABEL: g: 22 ; CHECK-NOT-PIC: add r0, pc [all …]
|
D | stack_guard_remat.ll | 1 …-mtriple=thumbv7-apple-ios -relocation-model=pic -no-integrated-as | FileCheck %s -check-prefix=PIC 3 …ios -relocation-model=dynamic-no-pic -no-integrated-as | FileCheck %s -check-prefix=DYNAMIC-NO-PIC 5 ;PIC: foo2 6 ;PIC: movw [[R0:r[0-9]+]], :lower16:(L___stack_chk_guard$non_lazy_ptr-([[LABEL0:LPC[0-9_]+]]+4)) 7 ;PIC: movt [[R0]], :upper16:(L___stack_chk_guard$non_lazy_ptr-([[LABEL0]]+4)) 8 ;PIC: [[LABEL0]]: 9 ;PIC: add [[R0]], pc 10 ;PIC: ldr [[R1:r[0-9]+]], {{\[}}[[R0]]{{\]}} 11 ;PIC: ldr {{r[0-9]+}}, {{\[}}[[R1]]{{\]}} 18 ;DYNAMIC-NO-PIC: foo2 [all …]
|
/external/swiftshader/third_party/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: f: 9 ; CHECK-NOT-PIC: add r0, pc 10 ; CHECK-NOT-PIC: ldr r1, [r0] 11 ; CHECK-NOT-PIC: i(gottpoff) 13 ; CHECK-PIC: f: 14 ; CHECK-PIC: bl __tls_get_addr(PLT) 21 ; CHECK-NOT-PIC: g: 22 ; CHECK-NOT-PIC: add r0, pc [all …]
|
/external/llvm/test/CodeGen/Thumb/ |
D | stack_guard_remat.ll | 1 …mtriple=thumb-apple-darwin -relocation-model=pic -no-integrated-as | FileCheck %s -check-prefix=PIC 2 …-relocation-model=static -no-integrated-as | FileCheck %s -check-prefix=NO-PIC -check-prefix=STAT… 3 …=dynamic-no-pic -no-integrated-as | FileCheck %s -check-prefix=NO-PIC -check-prefix=DYNAMIC-NO-PIC 5 ;PIC: foo2 6 ;PIC: ldr [[R0:r[0-9]+]], [[LABEL0:LCPI[0-9_]+]] 7 ;PIC: [[LABEL1:LPC[0-9_]+]]: 8 ;PIC: add [[R0]], pc 9 ;PIC: ldr [[R1:r[0-9]+]], {{\[}}[[R0]]{{\]}} 10 ;PIC: ldr [[R1:r[0-9]+]], {{\[}}[[R1]]{{\]}} 12 ;PIC: [[LABEL0]]: [all …]
|
/external/llvm/test/DebugInfo/Mips/ |
D | prologue_end.ll | 3 …llc -O0 -mtriple mips-unknown-linux-gnu -relocation-model=pic < %s | FileCheck %s -check-prefix=PIC 4 …s-unknown-linux-gnu -relocation-model=pic -disable-fp-elim < %s | FileCheck %s -check-prefix=PIC-FP 29 ; PIC: lui $[[R0:[0-9]+]], %hi(_gp_disp) 30 ; PIC: addiu $[[R0]], $[[R0]], %lo(_gp_disp) 31 ; PIC: addiu $sp, $sp, -{{[0-9]+}} 32 ; PIC: sw $ra, {{[0-9]+}}($sp) 33 ; PIC: addu $[[R1:[0-9]+]], $[[R0]], $25 34 ; PIC: .loc 1 2 3 prologue_end 35 ; PIC: lw $[[R2:[0-9]+]], %got($.str)($[[R1]]) 37 ; PIC-FP: lui $[[R0:[0-9]+]], %hi(_gp_disp) [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-NOT: .LJTI0_0 60 ; CHECK-PIC: .LJTI0_0: 61 ; CHECK-PIC-NEXT: .word .LBB{{.*}}-.LJTI0_0 [all …]
|
/external/llvm/test/MC/Sparc/ |
D | sparc-pic.s | 1 …ch=sparcv9 --position-independent -filetype=obj | llvm-readobj -r | FileCheck --check-prefix=PIC %s 5 ! PIC: Relocations [ 6 ! PIC-NOT: 0x{{[0-9,A-F]+}} R_SPARC_WPLT30 .text 0xC 7 ! PIC: 0x{{[0-9,A-F]+}} R_SPARC_PC22 _GLOBAL_OFFSET_TABLE_ 0x4 8 ! PIC-NEXT: 0x{{[0-9,A-F]+}} R_SPARC_PC10 _GLOBAL_OFFSET_TABLE_ 0x8 9 ! PIC-NEXT: 0x{{[0-9,A-F]+}} R_SPARC_PC22 _GLOBAL_OFFSET_TABLE_ 0x0 10 ! PIC-NEXT: 0x{{[0-9,A-F]+}} R_SPARC_PC10 _GLOBAL_OFFSET_TABLE_ 0x0 11 ! PIC-NEXT: 0x{{[0-9,A-F]+}} R_SPARC_GOT22 AGlobalVar 0x0 12 ! PIC-NEXT: 0x{{[0-9,A-F]+}} R_SPARC_GOT10 AGlobalVar 0x0 13 ! PIC-NEXT: 0x{{[0-9,A-F]+}} R_SPARC_GOT22 AGlobalVar 0x0 [all …]
|
/external/llvm/test/CodeGen/Mips/compactbranches/ |
D | compact-branches.ll | 2 …sel -mcpu=mips64r6 -target-abi n64 -disable-mips-delay-filler < %s | FileCheck %s -check-prefix=PIC 7 ; PIC: jalrc $25 9 ; PIC: jalrc $25 18 ; PIC: jalrc $25 36 ; PIC: jalrc $25 38 ; PIC: jalrc $25 47 ; PIC: jalrc $25 61 ; PIC: jalrc $25 70 ; PIC: jalrc $25 101 ; PIC: jalrc $25 [all …]
|