github.com/go-asm/go@v1.21.1-0.20240213172139-40c5ead50c48/cmd/link/loadpe/ldpe.go (about)

     1  // Copyright 2010 The Go Authors. All rights reserved.
     2  // Use of this source code is governed by a BSD-style
     3  // license that can be found in the LICENSE file.
     4  
     5  // Package loadpe implements a PE/COFF file reader.
     6  package loadpe
     7  
     8  import (
     9  	"bytes"
    10  	"debug/pe"
    11  	"encoding/binary"
    12  	"errors"
    13  	"fmt"
    14  	"io"
    15  	"strings"
    16  
    17  	"github.com/go-asm/go/cmd/bio"
    18  	"github.com/go-asm/go/cmd/link/loader"
    19  	"github.com/go-asm/go/cmd/link/sym"
    20  	"github.com/go-asm/go/cmd/objabi"
    21  	"github.com/go-asm/go/cmd/sys"
    22  )
    23  
    24  const (
    25  	IMAGE_SYM_UNDEFINED              = 0
    26  	IMAGE_SYM_ABSOLUTE               = -1
    27  	IMAGE_SYM_DEBUG                  = -2
    28  	IMAGE_SYM_TYPE_NULL              = 0
    29  	IMAGE_SYM_TYPE_VOID              = 1
    30  	IMAGE_SYM_TYPE_CHAR              = 2
    31  	IMAGE_SYM_TYPE_SHORT             = 3
    32  	IMAGE_SYM_TYPE_INT               = 4
    33  	IMAGE_SYM_TYPE_LONG              = 5
    34  	IMAGE_SYM_TYPE_FLOAT             = 6
    35  	IMAGE_SYM_TYPE_DOUBLE            = 7
    36  	IMAGE_SYM_TYPE_STRUCT            = 8
    37  	IMAGE_SYM_TYPE_UNION             = 9
    38  	IMAGE_SYM_TYPE_ENUM              = 10
    39  	IMAGE_SYM_TYPE_MOE               = 11
    40  	IMAGE_SYM_TYPE_BYTE              = 12
    41  	IMAGE_SYM_TYPE_WORD              = 13
    42  	IMAGE_SYM_TYPE_UINT              = 14
    43  	IMAGE_SYM_TYPE_DWORD             = 15
    44  	IMAGE_SYM_TYPE_PCODE             = 32768
    45  	IMAGE_SYM_DTYPE_NULL             = 0
    46  	IMAGE_SYM_DTYPE_POINTER          = 1
    47  	IMAGE_SYM_DTYPE_FUNCTION         = 2
    48  	IMAGE_SYM_DTYPE_ARRAY            = 3
    49  	IMAGE_SYM_CLASS_END_OF_FUNCTION  = -1
    50  	IMAGE_SYM_CLASS_NULL             = 0
    51  	IMAGE_SYM_CLASS_AUTOMATIC        = 1
    52  	IMAGE_SYM_CLASS_EXTERNAL         = 2
    53  	IMAGE_SYM_CLASS_STATIC           = 3
    54  	IMAGE_SYM_CLASS_REGISTER         = 4
    55  	IMAGE_SYM_CLASS_EXTERNAL_DEF     = 5
    56  	IMAGE_SYM_CLASS_LABEL            = 6
    57  	IMAGE_SYM_CLASS_UNDEFINED_LABEL  = 7
    58  	IMAGE_SYM_CLASS_MEMBER_OF_STRUCT = 8
    59  	IMAGE_SYM_CLASS_ARGUMENT         = 9
    60  	IMAGE_SYM_CLASS_STRUCT_TAG       = 10
    61  	IMAGE_SYM_CLASS_MEMBER_OF_UNION  = 11
    62  	IMAGE_SYM_CLASS_UNION_TAG        = 12
    63  	IMAGE_SYM_CLASS_TYPE_DEFINITION  = 13
    64  	IMAGE_SYM_CLASS_UNDEFINED_STATIC = 14
    65  	IMAGE_SYM_CLASS_ENUM_TAG         = 15
    66  	IMAGE_SYM_CLASS_MEMBER_OF_ENUM   = 16
    67  	IMAGE_SYM_CLASS_REGISTER_PARAM   = 17
    68  	IMAGE_SYM_CLASS_BIT_FIELD        = 18
    69  	IMAGE_SYM_CLASS_FAR_EXTERNAL     = 68 /* Not in PECOFF v8 spec */
    70  	IMAGE_SYM_CLASS_BLOCK            = 100
    71  	IMAGE_SYM_CLASS_FUNCTION         = 101
    72  	IMAGE_SYM_CLASS_END_OF_STRUCT    = 102
    73  	IMAGE_SYM_CLASS_FILE             = 103
    74  	IMAGE_SYM_CLASS_SECTION          = 104
    75  	IMAGE_SYM_CLASS_WEAK_EXTERNAL    = 105
    76  	IMAGE_SYM_CLASS_CLR_TOKEN        = 107
    77  	IMAGE_REL_I386_ABSOLUTE          = 0x0000
    78  	IMAGE_REL_I386_DIR16             = 0x0001
    79  	IMAGE_REL_I386_REL16             = 0x0002
    80  	IMAGE_REL_I386_DIR32             = 0x0006
    81  	IMAGE_REL_I386_DIR32NB           = 0x0007
    82  	IMAGE_REL_I386_SEG12             = 0x0009
    83  	IMAGE_REL_I386_SECTION           = 0x000A
    84  	IMAGE_REL_I386_SECREL            = 0x000B
    85  	IMAGE_REL_I386_TOKEN             = 0x000C
    86  	IMAGE_REL_I386_SECREL7           = 0x000D
    87  	IMAGE_REL_I386_REL32             = 0x0014
    88  	IMAGE_REL_AMD64_ABSOLUTE         = 0x0000
    89  	IMAGE_REL_AMD64_ADDR64           = 0x0001
    90  	IMAGE_REL_AMD64_ADDR32           = 0x0002
    91  	IMAGE_REL_AMD64_ADDR32NB         = 0x0003
    92  	IMAGE_REL_AMD64_REL32            = 0x0004
    93  	IMAGE_REL_AMD64_REL32_1          = 0x0005
    94  	IMAGE_REL_AMD64_REL32_2          = 0x0006
    95  	IMAGE_REL_AMD64_REL32_3          = 0x0007
    96  	IMAGE_REL_AMD64_REL32_4          = 0x0008
    97  	IMAGE_REL_AMD64_REL32_5          = 0x0009
    98  	IMAGE_REL_AMD64_SECTION          = 0x000A
    99  	IMAGE_REL_AMD64_SECREL           = 0x000B
   100  	IMAGE_REL_AMD64_SECREL7          = 0x000C
   101  	IMAGE_REL_AMD64_TOKEN            = 0x000D
   102  	IMAGE_REL_AMD64_SREL32           = 0x000E
   103  	IMAGE_REL_AMD64_PAIR             = 0x000F
   104  	IMAGE_REL_AMD64_SSPAN32          = 0x0010
   105  	IMAGE_REL_ARM_ABSOLUTE           = 0x0000
   106  	IMAGE_REL_ARM_ADDR32             = 0x0001
   107  	IMAGE_REL_ARM_ADDR32NB           = 0x0002
   108  	IMAGE_REL_ARM_BRANCH24           = 0x0003
   109  	IMAGE_REL_ARM_BRANCH11           = 0x0004
   110  	IMAGE_REL_ARM_SECTION            = 0x000E
   111  	IMAGE_REL_ARM_SECREL             = 0x000F
   112  	IMAGE_REL_ARM_MOV32              = 0x0010
   113  	IMAGE_REL_THUMB_MOV32            = 0x0011
   114  	IMAGE_REL_THUMB_BRANCH20         = 0x0012
   115  	IMAGE_REL_THUMB_BRANCH24         = 0x0014
   116  	IMAGE_REL_THUMB_BLX23            = 0x0015
   117  	IMAGE_REL_ARM_PAIR               = 0x0016
   118  	IMAGE_REL_ARM64_ABSOLUTE         = 0x0000
   119  	IMAGE_REL_ARM64_ADDR32           = 0x0001
   120  	IMAGE_REL_ARM64_ADDR32NB         = 0x0002
   121  	IMAGE_REL_ARM64_BRANCH26         = 0x0003
   122  	IMAGE_REL_ARM64_PAGEBASE_REL21   = 0x0004
   123  	IMAGE_REL_ARM64_REL21            = 0x0005
   124  	IMAGE_REL_ARM64_PAGEOFFSET_12A   = 0x0006
   125  	IMAGE_REL_ARM64_PAGEOFFSET_12L   = 0x0007
   126  	IMAGE_REL_ARM64_SECREL           = 0x0008
   127  	IMAGE_REL_ARM64_SECREL_LOW12A    = 0x0009
   128  	IMAGE_REL_ARM64_SECREL_HIGH12A   = 0x000A
   129  	IMAGE_REL_ARM64_SECREL_LOW12L    = 0x000B
   130  	IMAGE_REL_ARM64_TOKEN            = 0x000C
   131  	IMAGE_REL_ARM64_SECTION          = 0x000D
   132  	IMAGE_REL_ARM64_ADDR64           = 0x000E
   133  	IMAGE_REL_ARM64_BRANCH19         = 0x000F
   134  	IMAGE_REL_ARM64_BRANCH14         = 0x0010
   135  	IMAGE_REL_ARM64_REL32            = 0x0011
   136  )
   137  
   138  const (
   139  	// When stored into the PLT value for a symbol, this token tells
   140  	// windynrelocsym to redirect direct references to this symbol to a stub
   141  	// that loads from the corresponding import symbol and then does
   142  	// a jump to the loaded value.
   143  	CreateImportStubPltToken = -2
   144  
   145  	// When stored into the GOT value for an import symbol __imp_X this
   146  	// token tells windynrelocsym to redirect references to the
   147  	// underlying DYNIMPORT symbol X.
   148  	RedirectToDynImportGotToken = -2
   149  )
   150  
   151  // TODO(brainman): maybe just add ReadAt method to bio.Reader instead of creating peBiobuf
   152  
   153  // peBiobuf makes bio.Reader look like io.ReaderAt.
   154  type peBiobuf bio.Reader
   155  
   156  func (f *peBiobuf) ReadAt(p []byte, off int64) (int, error) {
   157  	ret := ((*bio.Reader)(f)).MustSeek(off, 0)
   158  	if ret < 0 {
   159  		return 0, errors.New("fail to seek")
   160  	}
   161  	n, err := f.Read(p)
   162  	if err != nil {
   163  		return 0, err
   164  	}
   165  	return n, nil
   166  }
   167  
   168  // makeUpdater creates a loader.SymbolBuilder if one hasn't been created previously.
   169  // We use this to lazily make SymbolBuilders as we don't always need a builder, and creating them for all symbols might be an error.
   170  func makeUpdater(l *loader.Loader, bld *loader.SymbolBuilder, s loader.Sym) *loader.SymbolBuilder {
   171  	if bld != nil {
   172  		return bld
   173  	}
   174  	bld = l.MakeSymbolUpdater(s)
   175  	return bld
   176  }
   177  
   178  // peImportSymsState tracks the set of DLL import symbols we've seen
   179  // while reading host objects. We create a singleton instance of this
   180  // type, which will persist across multiple host objects.
   181  type peImportSymsState struct {
   182  
   183  	// Text and non-text sections read in by the host object loader.
   184  	secSyms []loader.Sym
   185  
   186  	// Loader and arch, for use in postprocessing.
   187  	l    *loader.Loader
   188  	arch *sys.Arch
   189  }
   190  
   191  var importSymsState *peImportSymsState
   192  
   193  func createImportSymsState(l *loader.Loader, arch *sys.Arch) {
   194  	if importSymsState != nil {
   195  		return
   196  	}
   197  	importSymsState = &peImportSymsState{
   198  		l:    l,
   199  		arch: arch,
   200  	}
   201  }
   202  
   203  // peLoaderState holds various bits of useful state information needed
   204  // while loading a single PE object file.
   205  type peLoaderState struct {
   206  	l               *loader.Loader
   207  	arch            *sys.Arch
   208  	f               *pe.File
   209  	pn              string
   210  	sectsyms        map[*pe.Section]loader.Sym
   211  	comdats         map[uint16]int64 // key is section index, val is size
   212  	sectdata        map[*pe.Section][]byte
   213  	localSymVersion int
   214  }
   215  
   216  // comdatDefinitions records the names of symbols for which we've
   217  // previously seen a definition in COMDAT. Key is symbol name, value
   218  // is symbol size (or -1 if we're using the "any" strategy).
   219  var comdatDefinitions map[string]int64
   220  
   221  // Symbols contains the symbols that can be loaded from a PE file.
   222  type Symbols struct {
   223  	Textp     []loader.Sym // text symbols
   224  	Resources []loader.Sym // .rsrc section or set of .rsrc$xx sections
   225  	PData     loader.Sym
   226  	XData     loader.Sym
   227  }
   228  
   229  // Load loads the PE file pn from input.
   230  // Symbols from the object file are created via the loader 'l'.
   231  func Load(l *loader.Loader, arch *sys.Arch, localSymVersion int, input *bio.Reader, pkg string, length int64, pn string) (*Symbols, error) {
   232  	state := &peLoaderState{
   233  		l:               l,
   234  		arch:            arch,
   235  		sectsyms:        make(map[*pe.Section]loader.Sym),
   236  		sectdata:        make(map[*pe.Section][]byte),
   237  		localSymVersion: localSymVersion,
   238  		pn:              pn,
   239  	}
   240  	createImportSymsState(state.l, state.arch)
   241  	if comdatDefinitions == nil {
   242  		comdatDefinitions = make(map[string]int64)
   243  	}
   244  
   245  	// Some input files are archives containing multiple of
   246  	// object files, and pe.NewFile seeks to the start of
   247  	// input file and get confused. Create section reader
   248  	// to stop pe.NewFile looking before current position.
   249  	sr := io.NewSectionReader((*peBiobuf)(input), input.Offset(), 1<<63-1)
   250  
   251  	// TODO: replace pe.NewFile with pe.Load (grep for "add Load function" in debug/pe for details)
   252  	f, err := pe.NewFile(sr)
   253  	if err != nil {
   254  		return nil, err
   255  	}
   256  	defer f.Close()
   257  	state.f = f
   258  
   259  	var ls Symbols
   260  
   261  	// TODO return error if found .cormeta
   262  
   263  	// create symbols for mapped sections
   264  	for _, sect := range f.Sections {
   265  		if sect.Characteristics&pe.IMAGE_SCN_MEM_DISCARDABLE != 0 {
   266  			continue
   267  		}
   268  
   269  		if sect.Characteristics&(pe.IMAGE_SCN_CNT_CODE|pe.IMAGE_SCN_CNT_INITIALIZED_DATA|pe.IMAGE_SCN_CNT_UNINITIALIZED_DATA) == 0 {
   270  			// This has been seen for .idata sections, which we
   271  			// want to ignore. See issues 5106 and 5273.
   272  			continue
   273  		}
   274  
   275  		name := fmt.Sprintf("%s(%s)", pkg, sect.Name)
   276  		s := state.l.LookupOrCreateCgoExport(name, localSymVersion)
   277  		bld := l.MakeSymbolUpdater(s)
   278  
   279  		switch sect.Characteristics & (pe.IMAGE_SCN_CNT_UNINITIALIZED_DATA | pe.IMAGE_SCN_CNT_INITIALIZED_DATA | pe.IMAGE_SCN_MEM_READ | pe.IMAGE_SCN_MEM_WRITE | pe.IMAGE_SCN_CNT_CODE | pe.IMAGE_SCN_MEM_EXECUTE) {
   280  		case pe.IMAGE_SCN_CNT_INITIALIZED_DATA | pe.IMAGE_SCN_MEM_READ: //.rdata
   281  			if issehsect(arch, sect) {
   282  				bld.SetType(sym.SSEHSECT)
   283  				bld.SetAlign(4)
   284  			} else {
   285  				bld.SetType(sym.SRODATA)
   286  			}
   287  
   288  		case pe.IMAGE_SCN_CNT_UNINITIALIZED_DATA | pe.IMAGE_SCN_MEM_READ | pe.IMAGE_SCN_MEM_WRITE: //.bss
   289  			bld.SetType(sym.SNOPTRBSS)
   290  
   291  		case pe.IMAGE_SCN_CNT_INITIALIZED_DATA | pe.IMAGE_SCN_MEM_READ | pe.IMAGE_SCN_MEM_WRITE: //.data
   292  			bld.SetType(sym.SNOPTRDATA)
   293  
   294  		case pe.IMAGE_SCN_CNT_CODE | pe.IMAGE_SCN_MEM_EXECUTE | pe.IMAGE_SCN_MEM_READ: //.text
   295  			bld.SetType(sym.STEXT)
   296  
   297  		default:
   298  			return nil, fmt.Errorf("unexpected flags %#06x for PE section %s", sect.Characteristics, sect.Name)
   299  		}
   300  
   301  		if bld.Type() != sym.SNOPTRBSS {
   302  			data, err := sect.Data()
   303  			if err != nil {
   304  				return nil, err
   305  			}
   306  			state.sectdata[sect] = data
   307  			bld.SetData(data)
   308  		}
   309  		bld.SetSize(int64(sect.Size))
   310  		state.sectsyms[sect] = s
   311  		if sect.Name == ".rsrc" || strings.HasPrefix(sect.Name, ".rsrc$") {
   312  			ls.Resources = append(ls.Resources, s)
   313  		} else if bld.Type() == sym.SSEHSECT {
   314  			if sect.Name == ".pdata" {
   315  				ls.PData = s
   316  			} else if sect.Name == ".xdata" {
   317  				ls.XData = s
   318  			}
   319  		}
   320  	}
   321  
   322  	// Make a prepass over the symbols to collect info about COMDAT symbols.
   323  	if err := state.preprocessSymbols(); err != nil {
   324  		return nil, err
   325  	}
   326  
   327  	// load relocations
   328  	for _, rsect := range f.Sections {
   329  		if _, found := state.sectsyms[rsect]; !found {
   330  			continue
   331  		}
   332  		if rsect.NumberOfRelocations == 0 {
   333  			continue
   334  		}
   335  		if rsect.Characteristics&pe.IMAGE_SCN_MEM_DISCARDABLE != 0 {
   336  			continue
   337  		}
   338  		if rsect.Characteristics&(pe.IMAGE_SCN_CNT_CODE|pe.IMAGE_SCN_CNT_INITIALIZED_DATA|pe.IMAGE_SCN_CNT_UNINITIALIZED_DATA) == 0 {
   339  			// This has been seen for .idata sections, which we
   340  			// want to ignore. See issues 5106 and 5273.
   341  			continue
   342  		}
   343  
   344  		splitResources := strings.HasPrefix(rsect.Name, ".rsrc$")
   345  		issehsect := issehsect(arch, rsect)
   346  		sb := l.MakeSymbolUpdater(state.sectsyms[rsect])
   347  		for j, r := range rsect.Relocs {
   348  			if int(r.SymbolTableIndex) >= len(f.COFFSymbols) {
   349  				return nil, fmt.Errorf("relocation number %d symbol index idx=%d cannot be large then number of symbols %d", j, r.SymbolTableIndex, len(f.COFFSymbols))
   350  			}
   351  			pesym := &f.COFFSymbols[r.SymbolTableIndex]
   352  			_, gosym, err := state.readpesym(pesym)
   353  			if err != nil {
   354  				return nil, err
   355  			}
   356  			if gosym == 0 {
   357  				name, err := pesym.FullName(f.StringTable)
   358  				if err != nil {
   359  					name = string(pesym.Name[:])
   360  				}
   361  				return nil, fmt.Errorf("reloc of invalid sym %s idx=%d type=%d", name, r.SymbolTableIndex, pesym.Type)
   362  			}
   363  
   364  			rSym := gosym
   365  			rSize := uint8(4)
   366  			rOff := int32(r.VirtualAddress)
   367  			var rAdd int64
   368  			var rType objabi.RelocType
   369  			switch arch.Family {
   370  			default:
   371  				return nil, fmt.Errorf("%s: unsupported arch %v", pn, arch.Family)
   372  			case sys.I386, sys.AMD64:
   373  				switch r.Type {
   374  				default:
   375  					return nil, fmt.Errorf("%s: %v: unknown relocation type %v", pn, state.sectsyms[rsect], r.Type)
   376  
   377  				case IMAGE_REL_I386_REL32, IMAGE_REL_AMD64_REL32,
   378  					IMAGE_REL_AMD64_ADDR32, // R_X86_64_PC32
   379  					IMAGE_REL_AMD64_ADDR32NB:
   380  					if r.Type == IMAGE_REL_AMD64_ADDR32NB {
   381  						rType = objabi.R_PEIMAGEOFF
   382  					} else {
   383  						rType = objabi.R_PCREL
   384  					}
   385  
   386  					rAdd = int64(int32(binary.LittleEndian.Uint32(state.sectdata[rsect][rOff:])))
   387  
   388  				case IMAGE_REL_I386_DIR32NB, IMAGE_REL_I386_DIR32:
   389  					if r.Type == IMAGE_REL_I386_DIR32NB {
   390  						rType = objabi.R_PEIMAGEOFF
   391  					} else {
   392  						rType = objabi.R_ADDR
   393  					}
   394  
   395  					// load addend from image
   396  					rAdd = int64(int32(binary.LittleEndian.Uint32(state.sectdata[rsect][rOff:])))
   397  
   398  				case IMAGE_REL_AMD64_ADDR64: // R_X86_64_64
   399  					rSize = 8
   400  
   401  					rType = objabi.R_ADDR
   402  
   403  					// load addend from image
   404  					rAdd = int64(binary.LittleEndian.Uint64(state.sectdata[rsect][rOff:]))
   405  				}
   406  
   407  			case sys.ARM:
   408  				switch r.Type {
   409  				default:
   410  					return nil, fmt.Errorf("%s: %v: unknown ARM relocation type %v", pn, state.sectsyms[rsect], r.Type)
   411  
   412  				case IMAGE_REL_ARM_SECREL:
   413  					rType = objabi.R_PCREL
   414  
   415  					rAdd = int64(int32(binary.LittleEndian.Uint32(state.sectdata[rsect][rOff:])))
   416  
   417  				case IMAGE_REL_ARM_ADDR32, IMAGE_REL_ARM_ADDR32NB:
   418  					if r.Type == IMAGE_REL_ARM_ADDR32NB {
   419  						rType = objabi.R_PEIMAGEOFF
   420  					} else {
   421  						rType = objabi.R_ADDR
   422  					}
   423  
   424  					rAdd = int64(int32(binary.LittleEndian.Uint32(state.sectdata[rsect][rOff:])))
   425  
   426  				case IMAGE_REL_ARM_BRANCH24:
   427  					rType = objabi.R_CALLARM
   428  
   429  					rAdd = int64(int32(binary.LittleEndian.Uint32(state.sectdata[rsect][rOff:])))
   430  				}
   431  
   432  			case sys.ARM64:
   433  				switch r.Type {
   434  				default:
   435  					return nil, fmt.Errorf("%s: %v: unknown ARM64 relocation type %v", pn, state.sectsyms[rsect], r.Type)
   436  
   437  				case IMAGE_REL_ARM64_ADDR32, IMAGE_REL_ARM64_ADDR32NB:
   438  					if r.Type == IMAGE_REL_ARM64_ADDR32NB {
   439  						rType = objabi.R_PEIMAGEOFF
   440  					} else {
   441  						rType = objabi.R_ADDR
   442  					}
   443  
   444  					rAdd = int64(int32(binary.LittleEndian.Uint32(state.sectdata[rsect][rOff:])))
   445  				}
   446  			}
   447  
   448  			// ld -r could generate multiple section symbols for the
   449  			// same section but with different values, we have to take
   450  			// that into account, or in the case of split resources,
   451  			// the section and its symbols are split into two sections.
   452  			if issect(pesym) || splitResources {
   453  				rAdd += int64(pesym.Value)
   454  			}
   455  			if issehsect {
   456  				// .pdata and .xdata sections can contain records
   457  				// associated to functions that won't be used in
   458  				// the final binary, in which case the relocation
   459  				// target symbol won't be reachable.
   460  				rType |= objabi.R_WEAK
   461  			}
   462  
   463  			rel, _ := sb.AddRel(rType)
   464  			rel.SetOff(rOff)
   465  			rel.SetSiz(rSize)
   466  			rel.SetSym(rSym)
   467  			rel.SetAdd(rAdd)
   468  
   469  		}
   470  
   471  		sb.SortRelocs()
   472  	}
   473  
   474  	// enter sub-symbols into symbol table.
   475  	for i, numaux := 0, 0; i < len(f.COFFSymbols); i += numaux + 1 {
   476  		pesym := &f.COFFSymbols[i]
   477  
   478  		numaux = int(pesym.NumberOfAuxSymbols)
   479  
   480  		name, err := pesym.FullName(f.StringTable)
   481  		if err != nil {
   482  			return nil, err
   483  		}
   484  		if name == "" {
   485  			continue
   486  		}
   487  		if issect(pesym) {
   488  			continue
   489  		}
   490  		if int(pesym.SectionNumber) > len(f.Sections) {
   491  			continue
   492  		}
   493  		if pesym.SectionNumber == IMAGE_SYM_DEBUG {
   494  			continue
   495  		}
   496  		if pesym.SectionNumber == IMAGE_SYM_ABSOLUTE && bytes.Equal(pesym.Name[:], []byte("@feat.00")) {
   497  			// The PE documentation says that, on x86 platforms, the absolute symbol named @feat.00
   498  			// is used to indicate that the COFF object supports SEH.
   499  			// Go doesn't support SEH on windows/386, so we can ignore this symbol.
   500  			// See https://learn.microsoft.com/en-us/windows/win32/debug/pe-format#the-sxdata-section
   501  			continue
   502  		}
   503  		var sect *pe.Section
   504  		if pesym.SectionNumber > 0 {
   505  			sect = f.Sections[pesym.SectionNumber-1]
   506  			if _, found := state.sectsyms[sect]; !found {
   507  				continue
   508  			}
   509  		}
   510  
   511  		bld, s, err := state.readpesym(pesym)
   512  		if err != nil {
   513  			return nil, err
   514  		}
   515  
   516  		if pesym.SectionNumber == 0 { // extern
   517  			if l.SymType(s) == sym.SXREF && pesym.Value > 0 { // global data
   518  				bld = makeUpdater(l, bld, s)
   519  				bld.SetType(sym.SNOPTRDATA)
   520  				bld.SetSize(int64(pesym.Value))
   521  			}
   522  
   523  			continue
   524  		} else if pesym.SectionNumber > 0 && int(pesym.SectionNumber) <= len(f.Sections) {
   525  			sect = f.Sections[pesym.SectionNumber-1]
   526  			if _, found := state.sectsyms[sect]; !found {
   527  				return nil, fmt.Errorf("%s: %v: missing sect.sym", pn, s)
   528  			}
   529  		} else {
   530  			return nil, fmt.Errorf("%s: %v: sectnum < 0!", pn, s)
   531  		}
   532  
   533  		if sect == nil {
   534  			return nil, nil
   535  		}
   536  
   537  		// Check for COMDAT symbol.
   538  		if sz, ok1 := state.comdats[uint16(pesym.SectionNumber-1)]; ok1 {
   539  			if psz, ok2 := comdatDefinitions[l.SymName(s)]; ok2 {
   540  				if sz == psz {
   541  					//  OK to discard, we've seen an instance
   542  					// already.
   543  					continue
   544  				}
   545  			}
   546  		}
   547  		if l.OuterSym(s) != 0 {
   548  			if l.AttrDuplicateOK(s) {
   549  				continue
   550  			}
   551  			outerName := l.SymName(l.OuterSym(s))
   552  			sectName := l.SymName(state.sectsyms[sect])
   553  			return nil, fmt.Errorf("%s: duplicate symbol reference: %s in both %s and %s", pn, l.SymName(s), outerName, sectName)
   554  		}
   555  
   556  		bld = makeUpdater(l, bld, s)
   557  		sectsym := state.sectsyms[sect]
   558  		bld.SetType(l.SymType(sectsym))
   559  		l.AddInteriorSym(sectsym, s)
   560  		bld.SetValue(int64(pesym.Value))
   561  		bld.SetSize(4)
   562  		if l.SymType(sectsym) == sym.STEXT {
   563  			if bld.External() && !bld.DuplicateOK() {
   564  				return nil, fmt.Errorf("%s: duplicate symbol definition", l.SymName(s))
   565  			}
   566  			bld.SetExternal(true)
   567  		}
   568  		if sz, ok := state.comdats[uint16(pesym.SectionNumber-1)]; ok {
   569  			// This is a COMDAT definition. Record that we're picking
   570  			// this instance so that we can ignore future defs.
   571  			if _, ok := comdatDefinitions[l.SymName(s)]; ok {
   572  				return nil, fmt.Errorf("internal error: preexisting COMDAT definition for %q", name)
   573  			}
   574  			comdatDefinitions[l.SymName(s)] = sz
   575  		}
   576  	}
   577  
   578  	// Sort outer lists by address, adding to textp.
   579  	// This keeps textp in increasing address order.
   580  	for _, sect := range f.Sections {
   581  		s := state.sectsyms[sect]
   582  		if s == 0 {
   583  			continue
   584  		}
   585  		l.SortSub(s)
   586  		importSymsState.secSyms = append(importSymsState.secSyms, s)
   587  		if l.SymType(s) == sym.STEXT {
   588  			for ; s != 0; s = l.SubSym(s) {
   589  				if l.AttrOnList(s) {
   590  					return nil, fmt.Errorf("symbol %s listed multiple times", l.SymName(s))
   591  				}
   592  				l.SetAttrOnList(s, true)
   593  				ls.Textp = append(ls.Textp, s)
   594  			}
   595  		}
   596  	}
   597  
   598  	if ls.PData != 0 {
   599  		processSEH(l, arch, ls.PData, ls.XData)
   600  	}
   601  
   602  	return &ls, nil
   603  }
   604  
   605  // PostProcessImports works to resolve inconsistencies with DLL import
   606  // symbols; it is needed when building with more "modern" C compilers
   607  // with internal linkage.
   608  //
   609  // Background: DLL import symbols are data (SNOPTRDATA) symbols whose
   610  // name is of the form "__imp_XXX", which contain a pointer/reference
   611  // to symbol XXX. It's possible to have import symbols for both data
   612  // symbols ("__imp__fmode") and text symbols ("__imp_CreateEventA").
   613  // In some case import symbols are just references to some external
   614  // thing, and in other cases we see actual definitions of import
   615  // symbols when reading host objects.
   616  //
   617  // Previous versions of the linker would in most cases immediately
   618  // "forward" import symbol references, e.g. treat a references to
   619  // "__imp_XXX" a references to "XXX", however this doesn't work well
   620  // with more modern compilers, where you can sometimes see import
   621  // symbols that are defs (as opposed to external refs).
   622  //
   623  // The main actions taken below are to search for references to
   624  // SDYNIMPORT symbols in host object text/data sections and flag the
   625  // symbols for later fixup. When we see a reference to an import
   626  // symbol __imp_XYZ where XYZ corresponds to some SDYNIMPORT symbol,
   627  // we flag the symbol (via GOT setting) so that it can be redirected
   628  // to XYZ later in windynrelocsym. When we see a direct reference to
   629  // an SDYNIMPORT symbol XYZ, we also flag the symbol (via PLT setting)
   630  // to indicated that the reference will need to be redirected to a
   631  // stub.
   632  func PostProcessImports() error {
   633  	ldr := importSymsState.l
   634  	arch := importSymsState.arch
   635  	keeprelocneeded := make(map[loader.Sym]loader.Sym)
   636  	for _, s := range importSymsState.secSyms {
   637  		isText := ldr.SymType(s) == sym.STEXT
   638  		relocs := ldr.Relocs(s)
   639  		for i := 0; i < relocs.Count(); i++ {
   640  			r := relocs.At(i)
   641  			rs := r.Sym()
   642  			if ldr.SymType(rs) == sym.SDYNIMPORT {
   643  				// Tag the symbol for later stub generation.
   644  				ldr.SetPlt(rs, CreateImportStubPltToken)
   645  				continue
   646  			}
   647  			isym, err := LookupBaseFromImport(rs, ldr, arch)
   648  			if err != nil {
   649  				return err
   650  			}
   651  			if isym == 0 {
   652  				continue
   653  			}
   654  			if ldr.SymType(isym) != sym.SDYNIMPORT {
   655  				continue
   656  			}
   657  			// For non-text symbols, forward the reference from __imp_X to
   658  			// X immediately.
   659  			if !isText {
   660  				r.SetSym(isym)
   661  				continue
   662  			}
   663  			// Flag this imp symbol to be processed later in windynrelocsym.
   664  			ldr.SetGot(rs, RedirectToDynImportGotToken)
   665  			// Consistency check: should be no PLT token here.
   666  			splt := ldr.SymPlt(rs)
   667  			if splt != -1 {
   668  				return fmt.Errorf("internal error: import symbol %q has invalid PLT setting %d", ldr.SymName(rs), splt)
   669  			}
   670  			// Flag for dummy relocation.
   671  			keeprelocneeded[rs] = isym
   672  		}
   673  	}
   674  	for k, v := range keeprelocneeded {
   675  		sb := ldr.MakeSymbolUpdater(k)
   676  		r, _ := sb.AddRel(objabi.R_KEEP)
   677  		r.SetSym(v)
   678  	}
   679  	importSymsState = nil
   680  	return nil
   681  }
   682  
   683  func issehsect(arch *sys.Arch, s *pe.Section) bool {
   684  	return arch.Family == sys.AMD64 && (s.Name == ".pdata" || s.Name == ".xdata")
   685  }
   686  
   687  func issect(s *pe.COFFSymbol) bool {
   688  	return s.StorageClass == IMAGE_SYM_CLASS_STATIC && s.Type == 0 && s.Name[0] == '.'
   689  }
   690  
   691  func (state *peLoaderState) readpesym(pesym *pe.COFFSymbol) (*loader.SymbolBuilder, loader.Sym, error) {
   692  	symname, err := pesym.FullName(state.f.StringTable)
   693  	if err != nil {
   694  		return nil, 0, err
   695  	}
   696  	var name string
   697  	if issect(pesym) {
   698  		name = state.l.SymName(state.sectsyms[state.f.Sections[pesym.SectionNumber-1]])
   699  	} else {
   700  		name = symname
   701  		// A note on the "_main" exclusion below: the main routine
   702  		// defined by the Go runtime is named "_main", not "main", so
   703  		// when reading references to _main from a host object we want
   704  		// to avoid rewriting "_main" to "main" in this specific
   705  		// instance. See #issuecomment-1143698749 on #35006 for more
   706  		// details on this problem.
   707  		if state.arch.Family == sys.I386 && name[0] == '_' && name != "_main" && !strings.HasPrefix(name, "__imp_") {
   708  			name = name[1:] // _Name => Name
   709  		}
   710  	}
   711  
   712  	// remove last @XXX
   713  	if i := strings.LastIndex(name, "@"); i >= 0 {
   714  		name = name[:i]
   715  	}
   716  
   717  	var s loader.Sym
   718  	var bld *loader.SymbolBuilder
   719  	// Microsoft's PE documentation is contradictory. It says that the symbol's complex type
   720  	// is stored in the pesym.Type most significant byte, but MSVC, LLVM, and mingw store it
   721  	// in the 4 high bits of the less significant byte.
   722  	switch uint8(pesym.Type&0xf0) >> 4 {
   723  	default:
   724  		return nil, 0, fmt.Errorf("%s: invalid symbol type %d", symname, pesym.Type)
   725  
   726  	case IMAGE_SYM_DTYPE_FUNCTION, IMAGE_SYM_DTYPE_NULL:
   727  		switch pesym.StorageClass {
   728  		case IMAGE_SYM_CLASS_EXTERNAL: //global
   729  			s = state.l.LookupOrCreateCgoExport(name, 0)
   730  
   731  		case IMAGE_SYM_CLASS_NULL, IMAGE_SYM_CLASS_STATIC, IMAGE_SYM_CLASS_LABEL:
   732  			s = state.l.LookupOrCreateCgoExport(name, state.localSymVersion)
   733  			bld = makeUpdater(state.l, bld, s)
   734  			bld.SetDuplicateOK(true)
   735  
   736  		default:
   737  			return nil, 0, fmt.Errorf("%s: invalid symbol binding %d", symname, pesym.StorageClass)
   738  		}
   739  	}
   740  
   741  	if s != 0 && state.l.SymType(s) == 0 && (pesym.StorageClass != IMAGE_SYM_CLASS_STATIC || pesym.Value != 0) {
   742  		bld = makeUpdater(state.l, bld, s)
   743  		bld.SetType(sym.SXREF)
   744  	}
   745  
   746  	return bld, s, nil
   747  }
   748  
   749  // preprocessSymbols walks the COFF symbols for the PE file we're
   750  // reading and looks for cases where we have both a symbol definition
   751  // for "XXX" and an "__imp_XXX" symbol, recording these cases in a map
   752  // in the state struct. This information will be used in readpesym()
   753  // above to give such symbols special treatment. This function also
   754  // gathers information about COMDAT sections/symbols for later use
   755  // in readpesym().
   756  func (state *peLoaderState) preprocessSymbols() error {
   757  
   758  	// Locate comdat sections.
   759  	state.comdats = make(map[uint16]int64)
   760  	for i, s := range state.f.Sections {
   761  		if s.Characteristics&uint32(pe.IMAGE_SCN_LNK_COMDAT) != 0 {
   762  			state.comdats[uint16(i)] = int64(s.Size)
   763  		}
   764  	}
   765  
   766  	// Examine symbol defs.
   767  	for i, numaux := 0, 0; i < len(state.f.COFFSymbols); i += numaux + 1 {
   768  		pesym := &state.f.COFFSymbols[i]
   769  		numaux = int(pesym.NumberOfAuxSymbols)
   770  		if pesym.SectionNumber == 0 { // extern
   771  			continue
   772  		}
   773  		symname, err := pesym.FullName(state.f.StringTable)
   774  		if err != nil {
   775  			return err
   776  		}
   777  		if _, isc := state.comdats[uint16(pesym.SectionNumber-1)]; !isc {
   778  			continue
   779  		}
   780  		if pesym.StorageClass != uint8(IMAGE_SYM_CLASS_STATIC) {
   781  			continue
   782  		}
   783  		// This symbol corresponds to a COMDAT section. Read the
   784  		// aux data for it.
   785  		auxsymp, err := state.f.COFFSymbolReadSectionDefAux(i)
   786  		if err != nil {
   787  			return fmt.Errorf("unable to read aux info for section def symbol %d %s: pe.COFFSymbolReadComdatInfo returns %v", i, symname, err)
   788  		}
   789  		if auxsymp.Selection == pe.IMAGE_COMDAT_SELECT_SAME_SIZE {
   790  			// This is supported.
   791  		} else if auxsymp.Selection == pe.IMAGE_COMDAT_SELECT_ANY {
   792  			// Also supported.
   793  			state.comdats[uint16(pesym.SectionNumber-1)] = int64(-1)
   794  		} else {
   795  			// We don't support any of the other strategies at the
   796  			// moment. I suspect that we may need to also support
   797  			// "associative", we'll see.
   798  			return fmt.Errorf("internal error: unsupported COMDAT selection strategy found in path=%s sec=%d strategy=%d idx=%d, please file a bug", state.pn, auxsymp.SecNum, auxsymp.Selection, i)
   799  		}
   800  	}
   801  	return nil
   802  }
   803  
   804  // LookupBaseFromImport examines the symbol "s" to see if it
   805  // corresponds to an import symbol (name of the form "__imp_XYZ") and
   806  // if so, it looks up the underlying target of the import symbol and
   807  // returns it. An error is returned if the symbol is of the form
   808  // "__imp_XYZ" but no XYZ can be found.
   809  func LookupBaseFromImport(s loader.Sym, ldr *loader.Loader, arch *sys.Arch) (loader.Sym, error) {
   810  	sname := ldr.SymName(s)
   811  	if !strings.HasPrefix(sname, "__imp_") {
   812  		return 0, nil
   813  	}
   814  	basename := sname[len("__imp_"):]
   815  	if arch.Family == sys.I386 && basename[0] == '_' {
   816  		basename = basename[1:] // _Name => Name
   817  	}
   818  	isym := ldr.Lookup(basename, 0)
   819  	if isym == 0 {
   820  		return 0, fmt.Errorf("internal error: import symbol %q with no underlying sym", sname)
   821  	}
   822  	return isym, nil
   823  }