1  
     2  
     3  
     4  
     5  
     6  
     7  package stdlib
     8  
     9  var PackageSymbols = map[string][]Symbol{
    10  	"archive/tar": {
    11  		{"(*Header).FileInfo", Method, 1, ""},
    12  		{"(*Reader).Next", Method, 0, ""},
    13  		{"(*Reader).Read", Method, 0, ""},
    14  		{"(*Writer).AddFS", Method, 22, ""},
    15  		{"(*Writer).Close", Method, 0, ""},
    16  		{"(*Writer).Flush", Method, 0, ""},
    17  		{"(*Writer).Write", Method, 0, ""},
    18  		{"(*Writer).WriteHeader", Method, 0, ""},
    19  		{"(Format).String", Method, 10, ""},
    20  		{"ErrFieldTooLong", Var, 0, ""},
    21  		{"ErrHeader", Var, 0, ""},
    22  		{"ErrInsecurePath", Var, 20, ""},
    23  		{"ErrWriteAfterClose", Var, 0, ""},
    24  		{"ErrWriteTooLong", Var, 0, ""},
    25  		{"FileInfoHeader", Func, 1, "func(fi fs.FileInfo, link string) (*Header, error)"},
    26  		{"FileInfoNames", Type, 23, ""},
    27  		{"Format", Type, 10, ""},
    28  		{"FormatGNU", Const, 10, ""},
    29  		{"FormatPAX", Const, 10, ""},
    30  		{"FormatUSTAR", Const, 10, ""},
    31  		{"FormatUnknown", Const, 10, ""},
    32  		{"Header", Type, 0, ""},
    33  		{"Header.AccessTime", Field, 0, ""},
    34  		{"Header.ChangeTime", Field, 0, ""},
    35  		{"Header.Devmajor", Field, 0, ""},
    36  		{"Header.Devminor", Field, 0, ""},
    37  		{"Header.Format", Field, 10, ""},
    38  		{"Header.Gid", Field, 0, ""},
    39  		{"Header.Gname", Field, 0, ""},
    40  		{"Header.Linkname", Field, 0, ""},
    41  		{"Header.ModTime", Field, 0, ""},
    42  		{"Header.Mode", Field, 0, ""},
    43  		{"Header.Name", Field, 0, ""},
    44  		{"Header.PAXRecords", Field, 10, ""},
    45  		{"Header.Size", Field, 0, ""},
    46  		{"Header.Typeflag", Field, 0, ""},
    47  		{"Header.Uid", Field, 0, ""},
    48  		{"Header.Uname", Field, 0, ""},
    49  		{"Header.Xattrs", Field, 3, ""},
    50  		{"NewReader", Func, 0, "func(r io.Reader) *Reader"},
    51  		{"NewWriter", Func, 0, "func(w io.Writer) *Writer"},
    52  		{"Reader", Type, 0, ""},
    53  		{"TypeBlock", Const, 0, ""},
    54  		{"TypeChar", Const, 0, ""},
    55  		{"TypeCont", Const, 0, ""},
    56  		{"TypeDir", Const, 0, ""},
    57  		{"TypeFifo", Const, 0, ""},
    58  		{"TypeGNULongLink", Const, 1, ""},
    59  		{"TypeGNULongName", Const, 1, ""},
    60  		{"TypeGNUSparse", Const, 3, ""},
    61  		{"TypeLink", Const, 0, ""},
    62  		{"TypeReg", Const, 0, ""},
    63  		{"TypeRegA", Const, 0, ""},
    64  		{"TypeSymlink", Const, 0, ""},
    65  		{"TypeXGlobalHeader", Const, 0, ""},
    66  		{"TypeXHeader", Const, 0, ""},
    67  		{"Writer", Type, 0, ""},
    68  	},
    69  	"archive/zip": {
    70  		{"(*File).DataOffset", Method, 2, ""},
    71  		{"(*File).FileInfo", Method, 0, ""},
    72  		{"(*File).ModTime", Method, 0, ""},
    73  		{"(*File).Mode", Method, 0, ""},
    74  		{"(*File).Open", Method, 0, ""},
    75  		{"(*File).OpenRaw", Method, 17, ""},
    76  		{"(*File).SetModTime", Method, 0, ""},
    77  		{"(*File).SetMode", Method, 0, ""},
    78  		{"(*FileHeader).FileInfo", Method, 0, ""},
    79  		{"(*FileHeader).ModTime", Method, 0, ""},
    80  		{"(*FileHeader).Mode", Method, 0, ""},
    81  		{"(*FileHeader).SetModTime", Method, 0, ""},
    82  		{"(*FileHeader).SetMode", Method, 0, ""},
    83  		{"(*ReadCloser).Close", Method, 0, ""},
    84  		{"(*ReadCloser).Open", Method, 16, ""},
    85  		{"(*ReadCloser).RegisterDecompressor", Method, 6, ""},
    86  		{"(*Reader).Open", Method, 16, ""},
    87  		{"(*Reader).RegisterDecompressor", Method, 6, ""},
    88  		{"(*Writer).AddFS", Method, 22, ""},
    89  		{"(*Writer).Close", Method, 0, ""},
    90  		{"(*Writer).Copy", Method, 17, ""},
    91  		{"(*Writer).Create", Method, 0, ""},
    92  		{"(*Writer).CreateHeader", Method, 0, ""},
    93  		{"(*Writer).CreateRaw", Method, 17, ""},
    94  		{"(*Writer).Flush", Method, 4, ""},
    95  		{"(*Writer).RegisterCompressor", Method, 6, ""},
    96  		{"(*Writer).SetComment", Method, 10, ""},
    97  		{"(*Writer).SetOffset", Method, 5, ""},
    98  		{"Compressor", Type, 2, ""},
    99  		{"Decompressor", Type, 2, ""},
   100  		{"Deflate", Const, 0, ""},
   101  		{"ErrAlgorithm", Var, 0, ""},
   102  		{"ErrChecksum", Var, 0, ""},
   103  		{"ErrFormat", Var, 0, ""},
   104  		{"ErrInsecurePath", Var, 20, ""},
   105  		{"File", Type, 0, ""},
   106  		{"File.FileHeader", Field, 0, ""},
   107  		{"FileHeader", Type, 0, ""},
   108  		{"FileHeader.CRC32", Field, 0, ""},
   109  		{"FileHeader.Comment", Field, 0, ""},
   110  		{"FileHeader.CompressedSize", Field, 0, ""},
   111  		{"FileHeader.CompressedSize64", Field, 1, ""},
   112  		{"FileHeader.CreatorVersion", Field, 0, ""},
   113  		{"FileHeader.ExternalAttrs", Field, 0, ""},
   114  		{"FileHeader.Extra", Field, 0, ""},
   115  		{"FileHeader.Flags", Field, 0, ""},
   116  		{"FileHeader.Method", Field, 0, ""},
   117  		{"FileHeader.Modified", Field, 10, ""},
   118  		{"FileHeader.ModifiedDate", Field, 0, ""},
   119  		{"FileHeader.ModifiedTime", Field, 0, ""},
   120  		{"FileHeader.Name", Field, 0, ""},
   121  		{"FileHeader.NonUTF8", Field, 10, ""},
   122  		{"FileHeader.ReaderVersion", Field, 0, ""},
   123  		{"FileHeader.UncompressedSize", Field, 0, ""},
   124  		{"FileHeader.UncompressedSize64", Field, 1, ""},
   125  		{"FileInfoHeader", Func, 0, "func(fi fs.FileInfo) (*FileHeader, error)"},
   126  		{"NewReader", Func, 0, "func(r io.ReaderAt, size int64) (*Reader, error)"},
   127  		{"NewWriter", Func, 0, "func(w io.Writer) *Writer"},
   128  		{"OpenReader", Func, 0, "func(name string) (*ReadCloser, error)"},
   129  		{"ReadCloser", Type, 0, ""},
   130  		{"ReadCloser.Reader", Field, 0, ""},
   131  		{"Reader", Type, 0, ""},
   132  		{"Reader.Comment", Field, 0, ""},
   133  		{"Reader.File", Field, 0, ""},
   134  		{"RegisterCompressor", Func, 2, "func(method uint16, comp Compressor)"},
   135  		{"RegisterDecompressor", Func, 2, "func(method uint16, dcomp Decompressor)"},
   136  		{"Store", Const, 0, ""},
   137  		{"Writer", Type, 0, ""},
   138  	},
   139  	"bufio": {
   140  		{"(*Reader).Buffered", Method, 0, ""},
   141  		{"(*Reader).Discard", Method, 5, ""},
   142  		{"(*Reader).Peek", Method, 0, ""},
   143  		{"(*Reader).Read", Method, 0, ""},
   144  		{"(*Reader).ReadByte", Method, 0, ""},
   145  		{"(*Reader).ReadBytes", Method, 0, ""},
   146  		{"(*Reader).ReadLine", Method, 0, ""},
   147  		{"(*Reader).ReadRune", Method, 0, ""},
   148  		{"(*Reader).ReadSlice", Method, 0, ""},
   149  		{"(*Reader).ReadString", Method, 0, ""},
   150  		{"(*Reader).Reset", Method, 2, ""},
   151  		{"(*Reader).Size", Method, 10, ""},
   152  		{"(*Reader).UnreadByte", Method, 0, ""},
   153  		{"(*Reader).UnreadRune", Method, 0, ""},
   154  		{"(*Reader).WriteTo", Method, 1, ""},
   155  		{"(*Scanner).Buffer", Method, 6, ""},
   156  		{"(*Scanner).Bytes", Method, 1, ""},
   157  		{"(*Scanner).Err", Method, 1, ""},
   158  		{"(*Scanner).Scan", Method, 1, ""},
   159  		{"(*Scanner).Split", Method, 1, ""},
   160  		{"(*Scanner).Text", Method, 1, ""},
   161  		{"(*Writer).Available", Method, 0, ""},
   162  		{"(*Writer).AvailableBuffer", Method, 18, ""},
   163  		{"(*Writer).Buffered", Method, 0, ""},
   164  		{"(*Writer).Flush", Method, 0, ""},
   165  		{"(*Writer).ReadFrom", Method, 1, ""},
   166  		{"(*Writer).Reset", Method, 2, ""},
   167  		{"(*Writer).Size", Method, 10, ""},
   168  		{"(*Writer).Write", Method, 0, ""},
   169  		{"(*Writer).WriteByte", Method, 0, ""},
   170  		{"(*Writer).WriteRune", Method, 0, ""},
   171  		{"(*Writer).WriteString", Method, 0, ""},
   172  		{"(ReadWriter).Available", Method, 0, ""},
   173  		{"(ReadWriter).AvailableBuffer", Method, 18, ""},
   174  		{"(ReadWriter).Discard", Method, 5, ""},
   175  		{"(ReadWriter).Flush", Method, 0, ""},
   176  		{"(ReadWriter).Peek", Method, 0, ""},
   177  		{"(ReadWriter).Read", Method, 0, ""},
   178  		{"(ReadWriter).ReadByte", Method, 0, ""},
   179  		{"(ReadWriter).ReadBytes", Method, 0, ""},
   180  		{"(ReadWriter).ReadFrom", Method, 1, ""},
   181  		{"(ReadWriter).ReadLine", Method, 0, ""},
   182  		{"(ReadWriter).ReadRune", Method, 0, ""},
   183  		{"(ReadWriter).ReadSlice", Method, 0, ""},
   184  		{"(ReadWriter).ReadString", Method, 0, ""},
   185  		{"(ReadWriter).UnreadByte", Method, 0, ""},
   186  		{"(ReadWriter).UnreadRune", Method, 0, ""},
   187  		{"(ReadWriter).Write", Method, 0, ""},
   188  		{"(ReadWriter).WriteByte", Method, 0, ""},
   189  		{"(ReadWriter).WriteRune", Method, 0, ""},
   190  		{"(ReadWriter).WriteString", Method, 0, ""},
   191  		{"(ReadWriter).WriteTo", Method, 1, ""},
   192  		{"ErrAdvanceTooFar", Var, 1, ""},
   193  		{"ErrBadReadCount", Var, 15, ""},
   194  		{"ErrBufferFull", Var, 0, ""},
   195  		{"ErrFinalToken", Var, 6, ""},
   196  		{"ErrInvalidUnreadByte", Var, 0, ""},
   197  		{"ErrInvalidUnreadRune", Var, 0, ""},
   198  		{"ErrNegativeAdvance", Var, 1, ""},
   199  		{"ErrNegativeCount", Var, 0, ""},
   200  		{"ErrTooLong", Var, 1, ""},
   201  		{"MaxScanTokenSize", Const, 1, ""},
   202  		{"NewReadWriter", Func, 0, "func(r *Reader, w *Writer) *ReadWriter"},
   203  		{"NewReader", Func, 0, "func(rd io.Reader) *Reader"},
   204  		{"NewReaderSize", Func, 0, "func(rd io.Reader, size int) *Reader"},
   205  		{"NewScanner", Func, 1, "func(r io.Reader) *Scanner"},
   206  		{"NewWriter", Func, 0, "func(w io.Writer) *Writer"},
   207  		{"NewWriterSize", Func, 0, "func(w io.Writer, size int) *Writer"},
   208  		{"ReadWriter", Type, 0, ""},
   209  		{"ReadWriter.Reader", Field, 0, ""},
   210  		{"ReadWriter.Writer", Field, 0, ""},
   211  		{"Reader", Type, 0, ""},
   212  		{"ScanBytes", Func, 1, "func(data []byte, atEOF bool) (advance int, token []byte, err error)"},
   213  		{"ScanLines", Func, 1, "func(data []byte, atEOF bool) (advance int, token []byte, err error)"},
   214  		{"ScanRunes", Func, 1, "func(data []byte, atEOF bool) (advance int, token []byte, err error)"},
   215  		{"ScanWords", Func, 1, "func(data []byte, atEOF bool) (advance int, token []byte, err error)"},
   216  		{"Scanner", Type, 1, ""},
   217  		{"SplitFunc", Type, 1, ""},
   218  		{"Writer", Type, 0, ""},
   219  	},
   220  	"bytes": {
   221  		{"(*Buffer).Available", Method, 21, ""},
   222  		{"(*Buffer).AvailableBuffer", Method, 21, ""},
   223  		{"(*Buffer).Bytes", Method, 0, ""},
   224  		{"(*Buffer).Cap", Method, 5, ""},
   225  		{"(*Buffer).Grow", Method, 1, ""},
   226  		{"(*Buffer).Len", Method, 0, ""},
   227  		{"(*Buffer).Next", Method, 0, ""},
   228  		{"(*Buffer).Read", Method, 0, ""},
   229  		{"(*Buffer).ReadByte", Method, 0, ""},
   230  		{"(*Buffer).ReadBytes", Method, 0, ""},
   231  		{"(*Buffer).ReadFrom", Method, 0, ""},
   232  		{"(*Buffer).ReadRune", Method, 0, ""},
   233  		{"(*Buffer).ReadString", Method, 0, ""},
   234  		{"(*Buffer).Reset", Method, 0, ""},
   235  		{"(*Buffer).String", Method, 0, ""},
   236  		{"(*Buffer).Truncate", Method, 0, ""},
   237  		{"(*Buffer).UnreadByte", Method, 0, ""},
   238  		{"(*Buffer).UnreadRune", Method, 0, ""},
   239  		{"(*Buffer).Write", Method, 0, ""},
   240  		{"(*Buffer).WriteByte", Method, 0, ""},
   241  		{"(*Buffer).WriteRune", Method, 0, ""},
   242  		{"(*Buffer).WriteString", Method, 0, ""},
   243  		{"(*Buffer).WriteTo", Method, 0, ""},
   244  		{"(*Reader).Len", Method, 0, ""},
   245  		{"(*Reader).Read", Method, 0, ""},
   246  		{"(*Reader).ReadAt", Method, 0, ""},
   247  		{"(*Reader).ReadByte", Method, 0, ""},
   248  		{"(*Reader).ReadRune", Method, 0, ""},
   249  		{"(*Reader).Reset", Method, 7, ""},
   250  		{"(*Reader).Seek", Method, 0, ""},
   251  		{"(*Reader).Size", Method, 5, ""},
   252  		{"(*Reader).UnreadByte", Method, 0, ""},
   253  		{"(*Reader).UnreadRune", Method, 0, ""},
   254  		{"(*Reader).WriteTo", Method, 1, ""},
   255  		{"Buffer", Type, 0, ""},
   256  		{"Clone", Func, 20, "func(b []byte) []byte"},
   257  		{"Compare", Func, 0, "func(a []byte, b []byte) int"},
   258  		{"Contains", Func, 0, "func(b []byte, subslice []byte) bool"},
   259  		{"ContainsAny", Func, 7, "func(b []byte, chars string) bool"},
   260  		{"ContainsFunc", Func, 21, "func(b []byte, f func(rune) bool) bool"},
   261  		{"ContainsRune", Func, 7, "func(b []byte, r rune) bool"},
   262  		{"Count", Func, 0, "func(s []byte, sep []byte) int"},
   263  		{"Cut", Func, 18, "func(s []byte, sep []byte) (before []byte, after []byte, found bool)"},
   264  		{"CutPrefix", Func, 20, "func(s []byte, prefix []byte) (after []byte, found bool)"},
   265  		{"CutSuffix", Func, 20, "func(s []byte, suffix []byte) (before []byte, found bool)"},
   266  		{"Equal", Func, 0, "func(a []byte, b []byte) bool"},
   267  		{"EqualFold", Func, 0, "func(s []byte, t []byte) bool"},
   268  		{"ErrTooLarge", Var, 0, ""},
   269  		{"Fields", Func, 0, "func(s []byte) [][]byte"},
   270  		{"FieldsFunc", Func, 0, "func(s []byte, f func(rune) bool) [][]byte"},
   271  		{"FieldsFuncSeq", Func, 24, "func(s []byte, f func(rune) bool) iter.Seq[[]byte]"},
   272  		{"FieldsSeq", Func, 24, "func(s []byte) iter.Seq[[]byte]"},
   273  		{"HasPrefix", Func, 0, "func(s []byte, prefix []byte) bool"},
   274  		{"HasSuffix", Func, 0, "func(s []byte, suffix []byte) bool"},
   275  		{"Index", Func, 0, "func(s []byte, sep []byte) int"},
   276  		{"IndexAny", Func, 0, "func(s []byte, chars string) int"},
   277  		{"IndexByte", Func, 0, "func(b []byte, c byte) int"},
   278  		{"IndexFunc", Func, 0, "func(s []byte, f func(r rune) bool) int"},
   279  		{"IndexRune", Func, 0, "func(s []byte, r rune) int"},
   280  		{"Join", Func, 0, "func(s [][]byte, sep []byte) []byte"},
   281  		{"LastIndex", Func, 0, "func(s []byte, sep []byte) int"},
   282  		{"LastIndexAny", Func, 0, "func(s []byte, chars string) int"},
   283  		{"LastIndexByte", Func, 5, "func(s []byte, c byte) int"},
   284  		{"LastIndexFunc", Func, 0, "func(s []byte, f func(r rune) bool) int"},
   285  		{"Lines", Func, 24, "func(s []byte) iter.Seq[[]byte]"},
   286  		{"Map", Func, 0, "func(mapping func(r rune) rune, s []byte) []byte"},
   287  		{"MinRead", Const, 0, ""},
   288  		{"NewBuffer", Func, 0, "func(buf []byte) *Buffer"},
   289  		{"NewBufferString", Func, 0, "func(s string) *Buffer"},
   290  		{"NewReader", Func, 0, "func(b []byte) *Reader"},
   291  		{"Reader", Type, 0, ""},
   292  		{"Repeat", Func, 0, "func(b []byte, count int) []byte"},
   293  		{"Replace", Func, 0, "func(s []byte, old []byte, new []byte, n int) []byte"},
   294  		{"ReplaceAll", Func, 12, "func(s []byte, old []byte, new []byte) []byte"},
   295  		{"Runes", Func, 0, "func(s []byte) []rune"},
   296  		{"Split", Func, 0, "func(s []byte, sep []byte) [][]byte"},
   297  		{"SplitAfter", Func, 0, "func(s []byte, sep []byte) [][]byte"},
   298  		{"SplitAfterN", Func, 0, "func(s []byte, sep []byte, n int) [][]byte"},
   299  		{"SplitAfterSeq", Func, 24, "func(s []byte, sep []byte) iter.Seq[[]byte]"},
   300  		{"SplitN", Func, 0, "func(s []byte, sep []byte, n int) [][]byte"},
   301  		{"SplitSeq", Func, 24, "func(s []byte, sep []byte) iter.Seq[[]byte]"},
   302  		{"Title", Func, 0, "func(s []byte) []byte"},
   303  		{"ToLower", Func, 0, "func(s []byte) []byte"},
   304  		{"ToLowerSpecial", Func, 0, "func(c unicode.SpecialCase, s []byte) []byte"},
   305  		{"ToTitle", Func, 0, "func(s []byte) []byte"},
   306  		{"ToTitleSpecial", Func, 0, "func(c unicode.SpecialCase, s []byte) []byte"},
   307  		{"ToUpper", Func, 0, "func(s []byte) []byte"},
   308  		{"ToUpperSpecial", Func, 0, "func(c unicode.SpecialCase, s []byte) []byte"},
   309  		{"ToValidUTF8", Func, 13, "func(s []byte, replacement []byte) []byte"},
   310  		{"Trim", Func, 0, "func(s []byte, cutset string) []byte"},
   311  		{"TrimFunc", Func, 0, "func(s []byte, f func(r rune) bool) []byte"},
   312  		{"TrimLeft", Func, 0, "func(s []byte, cutset string) []byte"},
   313  		{"TrimLeftFunc", Func, 0, "func(s []byte, f func(r rune) bool) []byte"},
   314  		{"TrimPrefix", Func, 1, "func(s []byte, prefix []byte) []byte"},
   315  		{"TrimRight", Func, 0, "func(s []byte, cutset string) []byte"},
   316  		{"TrimRightFunc", Func, 0, "func(s []byte, f func(r rune) bool) []byte"},
   317  		{"TrimSpace", Func, 0, "func(s []byte) []byte"},
   318  		{"TrimSuffix", Func, 1, "func(s []byte, suffix []byte) []byte"},
   319  	},
   320  	"cmp": {
   321  		{"Compare", Func, 21, "func[T Ordered](x T, y T) int"},
   322  		{"Less", Func, 21, "func[T Ordered](x T, y T) bool"},
   323  		{"Or", Func, 22, "func[T comparable](vals ...T) T"},
   324  		{"Ordered", Type, 21, ""},
   325  	},
   326  	"compress/bzip2": {
   327  		{"(StructuralError).Error", Method, 0, ""},
   328  		{"NewReader", Func, 0, "func(r io.Reader) io.Reader"},
   329  		{"StructuralError", Type, 0, ""},
   330  	},
   331  	"compress/flate": {
   332  		{"(*ReadError).Error", Method, 0, ""},
   333  		{"(*WriteError).Error", Method, 0, ""},
   334  		{"(*Writer).Close", Method, 0, ""},
   335  		{"(*Writer).Flush", Method, 0, ""},
   336  		{"(*Writer).Reset", Method, 2, ""},
   337  		{"(*Writer).Write", Method, 0, ""},
   338  		{"(CorruptInputError).Error", Method, 0, ""},
   339  		{"(InternalError).Error", Method, 0, ""},
   340  		{"BestCompression", Const, 0, ""},
   341  		{"BestSpeed", Const, 0, ""},
   342  		{"CorruptInputError", Type, 0, ""},
   343  		{"DefaultCompression", Const, 0, ""},
   344  		{"HuffmanOnly", Const, 7, ""},
   345  		{"InternalError", Type, 0, ""},
   346  		{"NewReader", Func, 0, "func(r io.Reader) io.ReadCloser"},
   347  		{"NewReaderDict", Func, 0, "func(r io.Reader, dict []byte) io.ReadCloser"},
   348  		{"NewWriter", Func, 0, "func(w io.Writer, level int) (*Writer, error)"},
   349  		{"NewWriterDict", Func, 0, "func(w io.Writer, level int, dict []byte) (*Writer, error)"},
   350  		{"NoCompression", Const, 0, ""},
   351  		{"ReadError", Type, 0, ""},
   352  		{"ReadError.Err", Field, 0, ""},
   353  		{"ReadError.Offset", Field, 0, ""},
   354  		{"Reader", Type, 0, ""},
   355  		{"Resetter", Type, 4, ""},
   356  		{"WriteError", Type, 0, ""},
   357  		{"WriteError.Err", Field, 0, ""},
   358  		{"WriteError.Offset", Field, 0, ""},
   359  		{"Writer", Type, 0, ""},
   360  	},
   361  	"compress/gzip": {
   362  		{"(*Reader).Close", Method, 0, ""},
   363  		{"(*Reader).Multistream", Method, 4, ""},
   364  		{"(*Reader).Read", Method, 0, ""},
   365  		{"(*Reader).Reset", Method, 3, ""},
   366  		{"(*Writer).Close", Method, 0, ""},
   367  		{"(*Writer).Flush", Method, 1, ""},
   368  		{"(*Writer).Reset", Method, 2, ""},
   369  		{"(*Writer).Write", Method, 0, ""},
   370  		{"BestCompression", Const, 0, ""},
   371  		{"BestSpeed", Const, 0, ""},
   372  		{"DefaultCompression", Const, 0, ""},
   373  		{"ErrChecksum", Var, 0, ""},
   374  		{"ErrHeader", Var, 0, ""},
   375  		{"Header", Type, 0, ""},
   376  		{"Header.Comment", Field, 0, ""},
   377  		{"Header.Extra", Field, 0, ""},
   378  		{"Header.ModTime", Field, 0, ""},
   379  		{"Header.Name", Field, 0, ""},
   380  		{"Header.OS", Field, 0, ""},
   381  		{"HuffmanOnly", Const, 8, ""},
   382  		{"NewReader", Func, 0, "func(r io.Reader) (*Reader, error)"},
   383  		{"NewWriter", Func, 0, "func(w io.Writer) *Writer"},
   384  		{"NewWriterLevel", Func, 0, "func(w io.Writer, level int) (*Writer, error)"},
   385  		{"NoCompression", Const, 0, ""},
   386  		{"Reader", Type, 0, ""},
   387  		{"Reader.Header", Field, 0, ""},
   388  		{"Writer", Type, 0, ""},
   389  		{"Writer.Header", Field, 0, ""},
   390  	},
   391  	"compress/lzw": {
   392  		{"(*Reader).Close", Method, 17, ""},
   393  		{"(*Reader).Read", Method, 17, ""},
   394  		{"(*Reader).Reset", Method, 17, ""},
   395  		{"(*Writer).Close", Method, 17, ""},
   396  		{"(*Writer).Reset", Method, 17, ""},
   397  		{"(*Writer).Write", Method, 17, ""},
   398  		{"LSB", Const, 0, ""},
   399  		{"MSB", Const, 0, ""},
   400  		{"NewReader", Func, 0, "func(r io.Reader, order Order, litWidth int) io.ReadCloser"},
   401  		{"NewWriter", Func, 0, "func(w io.Writer, order Order, litWidth int) io.WriteCloser"},
   402  		{"Order", Type, 0, ""},
   403  		{"Reader", Type, 17, ""},
   404  		{"Writer", Type, 17, ""},
   405  	},
   406  	"compress/zlib": {
   407  		{"(*Writer).Close", Method, 0, ""},
   408  		{"(*Writer).Flush", Method, 0, ""},
   409  		{"(*Writer).Reset", Method, 2, ""},
   410  		{"(*Writer).Write", Method, 0, ""},
   411  		{"BestCompression", Const, 0, ""},
   412  		{"BestSpeed", Const, 0, ""},
   413  		{"DefaultCompression", Const, 0, ""},
   414  		{"ErrChecksum", Var, 0, ""},
   415  		{"ErrDictionary", Var, 0, ""},
   416  		{"ErrHeader", Var, 0, ""},
   417  		{"HuffmanOnly", Const, 8, ""},
   418  		{"NewReader", Func, 0, "func(r io.Reader) (io.ReadCloser, error)"},
   419  		{"NewReaderDict", Func, 0, "func(r io.Reader, dict []byte) (io.ReadCloser, error)"},
   420  		{"NewWriter", Func, 0, "func(w io.Writer) *Writer"},
   421  		{"NewWriterLevel", Func, 0, "func(w io.Writer, level int) (*Writer, error)"},
   422  		{"NewWriterLevelDict", Func, 0, "func(w io.Writer, level int, dict []byte) (*Writer, error)"},
   423  		{"NoCompression", Const, 0, ""},
   424  		{"Resetter", Type, 4, ""},
   425  		{"Writer", Type, 0, ""},
   426  	},
   427  	"container/heap": {
   428  		{"Fix", Func, 2, "func(h Interface, i int)"},
   429  		{"Init", Func, 0, "func(h Interface)"},
   430  		{"Interface", Type, 0, ""},
   431  		{"Pop", Func, 0, "func(h Interface) any"},
   432  		{"Push", Func, 0, "func(h Interface, x any)"},
   433  		{"Remove", Func, 0, "func(h Interface, i int) any"},
   434  	},
   435  	"container/list": {
   436  		{"(*Element).Next", Method, 0, ""},
   437  		{"(*Element).Prev", Method, 0, ""},
   438  		{"(*List).Back", Method, 0, ""},
   439  		{"(*List).Front", Method, 0, ""},
   440  		{"(*List).Init", Method, 0, ""},
   441  		{"(*List).InsertAfter", Method, 0, ""},
   442  		{"(*List).InsertBefore", Method, 0, ""},
   443  		{"(*List).Len", Method, 0, ""},
   444  		{"(*List).MoveAfter", Method, 2, ""},
   445  		{"(*List).MoveBefore", Method, 2, ""},
   446  		{"(*List).MoveToBack", Method, 0, ""},
   447  		{"(*List).MoveToFront", Method, 0, ""},
   448  		{"(*List).PushBack", Method, 0, ""},
   449  		{"(*List).PushBackList", Method, 0, ""},
   450  		{"(*List).PushFront", Method, 0, ""},
   451  		{"(*List).PushFrontList", Method, 0, ""},
   452  		{"(*List).Remove", Method, 0, ""},
   453  		{"Element", Type, 0, ""},
   454  		{"Element.Value", Field, 0, ""},
   455  		{"List", Type, 0, ""},
   456  		{"New", Func, 0, "func() *List"},
   457  	},
   458  	"container/ring": {
   459  		{"(*Ring).Do", Method, 0, ""},
   460  		{"(*Ring).Len", Method, 0, ""},
   461  		{"(*Ring).Link", Method, 0, ""},
   462  		{"(*Ring).Move", Method, 0, ""},
   463  		{"(*Ring).Next", Method, 0, ""},
   464  		{"(*Ring).Prev", Method, 0, ""},
   465  		{"(*Ring).Unlink", Method, 0, ""},
   466  		{"New", Func, 0, "func(n int) *Ring"},
   467  		{"Ring", Type, 0, ""},
   468  		{"Ring.Value", Field, 0, ""},
   469  	},
   470  	"context": {
   471  		{"AfterFunc", Func, 21, "func(ctx Context, f func()) (stop func() bool)"},
   472  		{"Background", Func, 7, "func() Context"},
   473  		{"CancelCauseFunc", Type, 20, ""},
   474  		{"CancelFunc", Type, 7, ""},
   475  		{"Canceled", Var, 7, ""},
   476  		{"Cause", Func, 20, "func(c Context) error"},
   477  		{"Context", Type, 7, ""},
   478  		{"DeadlineExceeded", Var, 7, ""},
   479  		{"TODO", Func, 7, "func() Context"},
   480  		{"WithCancel", Func, 7, "func(parent Context) (ctx Context, cancel CancelFunc)"},
   481  		{"WithCancelCause", Func, 20, "func(parent Context) (ctx Context, cancel CancelCauseFunc)"},
   482  		{"WithDeadline", Func, 7, "func(parent Context, d time.Time) (Context, CancelFunc)"},
   483  		{"WithDeadlineCause", Func, 21, "func(parent Context, d time.Time, cause error) (Context, CancelFunc)"},
   484  		{"WithTimeout", Func, 7, "func(parent Context, timeout time.Duration) (Context, CancelFunc)"},
   485  		{"WithTimeoutCause", Func, 21, "func(parent Context, timeout time.Duration, cause error) (Context, CancelFunc)"},
   486  		{"WithValue", Func, 7, "func(parent Context, key any, val any) Context"},
   487  		{"WithoutCancel", Func, 21, "func(parent Context) Context"},
   488  	},
   489  	"crypto": {
   490  		{"(Hash).Available", Method, 0, ""},
   491  		{"(Hash).HashFunc", Method, 4, ""},
   492  		{"(Hash).New", Method, 0, ""},
   493  		{"(Hash).Size", Method, 0, ""},
   494  		{"(Hash).String", Method, 15, ""},
   495  		{"BLAKE2b_256", Const, 9, ""},
   496  		{"BLAKE2b_384", Const, 9, ""},
   497  		{"BLAKE2b_512", Const, 9, ""},
   498  		{"BLAKE2s_256", Const, 9, ""},
   499  		{"Decrypter", Type, 5, ""},
   500  		{"DecrypterOpts", Type, 5, ""},
   501  		{"Hash", Type, 0, ""},
   502  		{"MD4", Const, 0, ""},
   503  		{"MD5", Const, 0, ""},
   504  		{"MD5SHA1", Const, 0, ""},
   505  		{"MessageSigner", Type, 25, ""},
   506  		{"PrivateKey", Type, 0, ""},
   507  		{"PublicKey", Type, 2, ""},
   508  		{"RIPEMD160", Const, 0, ""},
   509  		{"RegisterHash", Func, 0, "func(h Hash, f func() hash.Hash)"},
   510  		{"SHA1", Const, 0, ""},
   511  		{"SHA224", Const, 0, ""},
   512  		{"SHA256", Const, 0, ""},
   513  		{"SHA384", Const, 0, ""},
   514  		{"SHA3_224", Const, 4, ""},
   515  		{"SHA3_256", Const, 4, ""},
   516  		{"SHA3_384", Const, 4, ""},
   517  		{"SHA3_512", Const, 4, ""},
   518  		{"SHA512", Const, 0, ""},
   519  		{"SHA512_224", Const, 5, ""},
   520  		{"SHA512_256", Const, 5, ""},
   521  		{"SignMessage", Func, 25, "func(signer Signer, rand io.Reader, msg []byte, opts SignerOpts) (signature []byte, err error)"},
   522  		{"Signer", Type, 4, ""},
   523  		{"SignerOpts", Type, 4, ""},
   524  	},
   525  	"crypto/aes": {
   526  		{"(KeySizeError).Error", Method, 0, ""},
   527  		{"BlockSize", Const, 0, ""},
   528  		{"KeySizeError", Type, 0, ""},
   529  		{"NewCipher", Func, 0, "func(key []byte) (cipher.Block, error)"},
   530  	},
   531  	"crypto/cipher": {
   532  		{"(StreamReader).Read", Method, 0, ""},
   533  		{"(StreamWriter).Close", Method, 0, ""},
   534  		{"(StreamWriter).Write", Method, 0, ""},
   535  		{"AEAD", Type, 2, ""},
   536  		{"Block", Type, 0, ""},
   537  		{"BlockMode", Type, 0, ""},
   538  		{"NewCBCDecrypter", Func, 0, "func(b Block, iv []byte) BlockMode"},
   539  		{"NewCBCEncrypter", Func, 0, "func(b Block, iv []byte) BlockMode"},
   540  		{"NewCFBDecrypter", Func, 0, "func(block Block, iv []byte) Stream"},
   541  		{"NewCFBEncrypter", Func, 0, "func(block Block, iv []byte) Stream"},
   542  		{"NewCTR", Func, 0, "func(block Block, iv []byte) Stream"},
   543  		{"NewGCM", Func, 2, "func(cipher Block) (AEAD, error)"},
   544  		{"NewGCMWithNonceSize", Func, 5, "func(cipher Block, size int) (AEAD, error)"},
   545  		{"NewGCMWithRandomNonce", Func, 24, "func(cipher Block) (AEAD, error)"},
   546  		{"NewGCMWithTagSize", Func, 11, "func(cipher Block, tagSize int) (AEAD, error)"},
   547  		{"NewOFB", Func, 0, "func(b Block, iv []byte) Stream"},
   548  		{"Stream", Type, 0, ""},
   549  		{"StreamReader", Type, 0, ""},
   550  		{"StreamReader.R", Field, 0, ""},
   551  		{"StreamReader.S", Field, 0, ""},
   552  		{"StreamWriter", Type, 0, ""},
   553  		{"StreamWriter.Err", Field, 0, ""},
   554  		{"StreamWriter.S", Field, 0, ""},
   555  		{"StreamWriter.W", Field, 0, ""},
   556  	},
   557  	"crypto/des": {
   558  		{"(KeySizeError).Error", Method, 0, ""},
   559  		{"BlockSize", Const, 0, ""},
   560  		{"KeySizeError", Type, 0, ""},
   561  		{"NewCipher", Func, 0, "func(key []byte) (cipher.Block, error)"},
   562  		{"NewTripleDESCipher", Func, 0, "func(key []byte) (cipher.Block, error)"},
   563  	},
   564  	"crypto/dsa": {
   565  		{"ErrInvalidPublicKey", Var, 0, ""},
   566  		{"GenerateKey", Func, 0, "func(priv *PrivateKey, rand io.Reader) error"},
   567  		{"GenerateParameters", Func, 0, "func(params *Parameters, rand io.Reader, sizes ParameterSizes) error"},
   568  		{"L1024N160", Const, 0, ""},
   569  		{"L2048N224", Const, 0, ""},
   570  		{"L2048N256", Const, 0, ""},
   571  		{"L3072N256", Const, 0, ""},
   572  		{"ParameterSizes", Type, 0, ""},
   573  		{"Parameters", Type, 0, ""},
   574  		{"Parameters.G", Field, 0, ""},
   575  		{"Parameters.P", Field, 0, ""},
   576  		{"Parameters.Q", Field, 0, ""},
   577  		{"PrivateKey", Type, 0, ""},
   578  		{"PrivateKey.PublicKey", Field, 0, ""},
   579  		{"PrivateKey.X", Field, 0, ""},
   580  		{"PublicKey", Type, 0, ""},
   581  		{"PublicKey.Parameters", Field, 0, ""},
   582  		{"PublicKey.Y", Field, 0, ""},
   583  		{"Sign", Func, 0, "func(rand io.Reader, priv *PrivateKey, hash []byte) (r *big.Int, s *big.Int, err error)"},
   584  		{"Verify", Func, 0, "func(pub *PublicKey, hash []byte, r *big.Int, s *big.Int) bool"},
   585  	},
   586  	"crypto/ecdh": {
   587  		{"(*PrivateKey).Bytes", Method, 20, ""},
   588  		{"(*PrivateKey).Curve", Method, 20, ""},
   589  		{"(*PrivateKey).ECDH", Method, 20, ""},
   590  		{"(*PrivateKey).Equal", Method, 20, ""},
   591  		{"(*PrivateKey).Public", Method, 20, ""},
   592  		{"(*PrivateKey).PublicKey", Method, 20, ""},
   593  		{"(*PublicKey).Bytes", Method, 20, ""},
   594  		{"(*PublicKey).Curve", Method, 20, ""},
   595  		{"(*PublicKey).Equal", Method, 20, ""},
   596  		{"Curve", Type, 20, ""},
   597  		{"P256", Func, 20, "func() Curve"},
   598  		{"P384", Func, 20, "func() Curve"},
   599  		{"P521", Func, 20, "func() Curve"},
   600  		{"PrivateKey", Type, 20, ""},
   601  		{"PublicKey", Type, 20, ""},
   602  		{"X25519", Func, 20, "func() Curve"},
   603  	},
   604  	"crypto/ecdsa": {
   605  		{"(*PrivateKey).Bytes", Method, 25, ""},
   606  		{"(*PrivateKey).ECDH", Method, 20, ""},
   607  		{"(*PrivateKey).Equal", Method, 15, ""},
   608  		{"(*PrivateKey).Public", Method, 4, ""},
   609  		{"(*PrivateKey).Sign", Method, 4, ""},
   610  		{"(*PublicKey).Bytes", Method, 25, ""},
   611  		{"(*PublicKey).ECDH", Method, 20, ""},
   612  		{"(*PublicKey).Equal", Method, 15, ""},
   613  		{"(PrivateKey).Add", Method, 0, ""},
   614  		{"(PrivateKey).Double", Method, 0, ""},
   615  		{"(PrivateKey).IsOnCurve", Method, 0, ""},
   616  		{"(PrivateKey).Params", Method, 0, ""},
   617  		{"(PrivateKey).ScalarBaseMult", Method, 0, ""},
   618  		{"(PrivateKey).ScalarMult", Method, 0, ""},
   619  		{"(PublicKey).Add", Method, 0, ""},
   620  		{"(PublicKey).Double", Method, 0, ""},
   621  		{"(PublicKey).IsOnCurve", Method, 0, ""},
   622  		{"(PublicKey).Params", Method, 0, ""},
   623  		{"(PublicKey).ScalarBaseMult", Method, 0, ""},
   624  		{"(PublicKey).ScalarMult", Method, 0, ""},
   625  		{"GenerateKey", Func, 0, "func(c elliptic.Curve, rand io.Reader) (*PrivateKey, error)"},
   626  		{"ParseRawPrivateKey", Func, 25, "func(curve elliptic.Curve, data []byte) (*PrivateKey, error)"},
   627  		{"ParseUncompressedPublicKey", Func, 25, "func(curve elliptic.Curve, data []byte) (*PublicKey, error)"},
   628  		{"PrivateKey", Type, 0, ""},
   629  		{"PrivateKey.D", Field, 0, ""},
   630  		{"PrivateKey.PublicKey", Field, 0, ""},
   631  		{"PublicKey", Type, 0, ""},
   632  		{"PublicKey.Curve", Field, 0, ""},
   633  		{"PublicKey.X", Field, 0, ""},
   634  		{"PublicKey.Y", Field, 0, ""},
   635  		{"Sign", Func, 0, "func(rand io.Reader, priv *PrivateKey, hash []byte) (r *big.Int, s *big.Int, err error)"},
   636  		{"SignASN1", Func, 15, "func(rand io.Reader, priv *PrivateKey, hash []byte) ([]byte, error)"},
   637  		{"Verify", Func, 0, "func(pub *PublicKey, hash []byte, r *big.Int, s *big.Int) bool"},
   638  		{"VerifyASN1", Func, 15, "func(pub *PublicKey, hash []byte, sig []byte) bool"},
   639  	},
   640  	"crypto/ed25519": {
   641  		{"(*Options).HashFunc", Method, 20, ""},
   642  		{"(PrivateKey).Equal", Method, 15, ""},
   643  		{"(PrivateKey).Public", Method, 13, ""},
   644  		{"(PrivateKey).Seed", Method, 13, ""},
   645  		{"(PrivateKey).Sign", Method, 13, ""},
   646  		{"(PublicKey).Equal", Method, 15, ""},
   647  		{"GenerateKey", Func, 13, "func(rand io.Reader) (PublicKey, PrivateKey, error)"},
   648  		{"NewKeyFromSeed", Func, 13, "func(seed []byte) PrivateKey"},
   649  		{"Options", Type, 20, ""},
   650  		{"Options.Context", Field, 20, ""},
   651  		{"Options.Hash", Field, 20, ""},
   652  		{"PrivateKey", Type, 13, ""},
   653  		{"PrivateKeySize", Const, 13, ""},
   654  		{"PublicKey", Type, 13, ""},
   655  		{"PublicKeySize", Const, 13, ""},
   656  		{"SeedSize", Const, 13, ""},
   657  		{"Sign", Func, 13, "func(privateKey PrivateKey, message []byte) []byte"},
   658  		{"SignatureSize", Const, 13, ""},
   659  		{"Verify", Func, 13, "func(publicKey PublicKey, message []byte, sig []byte) bool"},
   660  		{"VerifyWithOptions", Func, 20, "func(publicKey PublicKey, message []byte, sig []byte, opts *Options) error"},
   661  	},
   662  	"crypto/elliptic": {
   663  		{"(*CurveParams).Add", Method, 0, ""},
   664  		{"(*CurveParams).Double", Method, 0, ""},
   665  		{"(*CurveParams).IsOnCurve", Method, 0, ""},
   666  		{"(*CurveParams).Params", Method, 0, ""},
   667  		{"(*CurveParams).ScalarBaseMult", Method, 0, ""},
   668  		{"(*CurveParams).ScalarMult", Method, 0, ""},
   669  		{"Curve", Type, 0, ""},
   670  		{"CurveParams", Type, 0, ""},
   671  		{"CurveParams.B", Field, 0, ""},
   672  		{"CurveParams.BitSize", Field, 0, ""},
   673  		{"CurveParams.Gx", Field, 0, ""},
   674  		{"CurveParams.Gy", Field, 0, ""},
   675  		{"CurveParams.N", Field, 0, ""},
   676  		{"CurveParams.Name", Field, 5, ""},
   677  		{"CurveParams.P", Field, 0, ""},
   678  		{"GenerateKey", Func, 0, "func(curve Curve, rand io.Reader) (priv []byte, x *big.Int, y *big.Int, err error)"},
   679  		{"Marshal", Func, 0, "func(curve Curve, x *big.Int, y *big.Int) []byte"},
   680  		{"MarshalCompressed", Func, 15, "func(curve Curve, x *big.Int, y *big.Int) []byte"},
   681  		{"P224", Func, 0, "func() Curve"},
   682  		{"P256", Func, 0, "func() Curve"},
   683  		{"P384", Func, 0, "func() Curve"},
   684  		{"P521", Func, 0, "func() Curve"},
   685  		{"Unmarshal", Func, 0, "func(curve Curve, data []byte) (x *big.Int, y *big.Int)"},
   686  		{"UnmarshalCompressed", Func, 15, "func(curve Curve, data []byte) (x *big.Int, y *big.Int)"},
   687  	},
   688  	"crypto/fips140": {
   689  		{"Enabled", Func, 24, "func() bool"},
   690  	},
   691  	"crypto/hkdf": {
   692  		{"Expand", Func, 24, "func[H hash.Hash](h func() H, pseudorandomKey []byte, info string, keyLength int) ([]byte, error)"},
   693  		{"Extract", Func, 24, "func[H hash.Hash](h func() H, secret []byte, salt []byte) ([]byte, error)"},
   694  		{"Key", Func, 24, "func[Hash hash.Hash](h func() Hash, secret []byte, salt []byte, info string, keyLength int) ([]byte, error)"},
   695  	},
   696  	"crypto/hmac": {
   697  		{"Equal", Func, 1, "func(mac1 []byte, mac2 []byte) bool"},
   698  		{"New", Func, 0, "func(h func() hash.Hash, key []byte) hash.Hash"},
   699  	},
   700  	"crypto/md5": {
   701  		{"BlockSize", Const, 0, ""},
   702  		{"New", Func, 0, "func() hash.Hash"},
   703  		{"Size", Const, 0, ""},
   704  		{"Sum", Func, 2, "func(data []byte) [16]byte"},
   705  	},
   706  	"crypto/mlkem": {
   707  		{"(*DecapsulationKey1024).Bytes", Method, 24, ""},
   708  		{"(*DecapsulationKey1024).Decapsulate", Method, 24, ""},
   709  		{"(*DecapsulationKey1024).EncapsulationKey", Method, 24, ""},
   710  		{"(*DecapsulationKey768).Bytes", Method, 24, ""},
   711  		{"(*DecapsulationKey768).Decapsulate", Method, 24, ""},
   712  		{"(*DecapsulationKey768).EncapsulationKey", Method, 24, ""},
   713  		{"(*EncapsulationKey1024).Bytes", Method, 24, ""},
   714  		{"(*EncapsulationKey1024).Encapsulate", Method, 24, ""},
   715  		{"(*EncapsulationKey768).Bytes", Method, 24, ""},
   716  		{"(*EncapsulationKey768).Encapsulate", Method, 24, ""},
   717  		{"CiphertextSize1024", Const, 24, ""},
   718  		{"CiphertextSize768", Const, 24, ""},
   719  		{"DecapsulationKey1024", Type, 24, ""},
   720  		{"DecapsulationKey768", Type, 24, ""},
   721  		{"EncapsulationKey1024", Type, 24, ""},
   722  		{"EncapsulationKey768", Type, 24, ""},
   723  		{"EncapsulationKeySize1024", Const, 24, ""},
   724  		{"EncapsulationKeySize768", Const, 24, ""},
   725  		{"GenerateKey1024", Func, 24, "func() (*DecapsulationKey1024, error)"},
   726  		{"GenerateKey768", Func, 24, "func() (*DecapsulationKey768, error)"},
   727  		{"NewDecapsulationKey1024", Func, 24, "func(seed []byte) (*DecapsulationKey1024, error)"},
   728  		{"NewDecapsulationKey768", Func, 24, "func(seed []byte) (*DecapsulationKey768, error)"},
   729  		{"NewEncapsulationKey1024", Func, 24, "func(encapsulationKey []byte) (*EncapsulationKey1024, error)"},
   730  		{"NewEncapsulationKey768", Func, 24, "func(encapsulationKey []byte) (*EncapsulationKey768, error)"},
   731  		{"SeedSize", Const, 24, ""},
   732  		{"SharedKeySize", Const, 24, ""},
   733  	},
   734  	"crypto/pbkdf2": {
   735  		{"Key", Func, 24, "func[Hash hash.Hash](h func() Hash, password string, salt []byte, iter int, keyLength int) ([]byte, error)"},
   736  	},
   737  	"crypto/rand": {
   738  		{"Int", Func, 0, "func(rand io.Reader, max *big.Int) (n *big.Int, err error)"},
   739  		{"Prime", Func, 0, "func(rand io.Reader, bits int) (*big.Int, error)"},
   740  		{"Read", Func, 0, "func(b []byte) (n int, err error)"},
   741  		{"Reader", Var, 0, ""},
   742  		{"Text", Func, 24, "func() string"},
   743  	},
   744  	"crypto/rc4": {
   745  		{"(*Cipher).Reset", Method, 0, ""},
   746  		{"(*Cipher).XORKeyStream", Method, 0, ""},
   747  		{"(KeySizeError).Error", Method, 0, ""},
   748  		{"Cipher", Type, 0, ""},
   749  		{"KeySizeError", Type, 0, ""},
   750  		{"NewCipher", Func, 0, "func(key []byte) (*Cipher, error)"},
   751  	},
   752  	"crypto/rsa": {
   753  		{"(*PSSOptions).HashFunc", Method, 4, ""},
   754  		{"(*PrivateKey).Decrypt", Method, 5, ""},
   755  		{"(*PrivateKey).Equal", Method, 15, ""},
   756  		{"(*PrivateKey).Precompute", Method, 0, ""},
   757  		{"(*PrivateKey).Public", Method, 4, ""},
   758  		{"(*PrivateKey).Sign", Method, 4, ""},
   759  		{"(*PrivateKey).Size", Method, 11, ""},
   760  		{"(*PrivateKey).Validate", Method, 0, ""},
   761  		{"(*PublicKey).Equal", Method, 15, ""},
   762  		{"(*PublicKey).Size", Method, 11, ""},
   763  		{"CRTValue", Type, 0, ""},
   764  		{"CRTValue.Coeff", Field, 0, ""},
   765  		{"CRTValue.Exp", Field, 0, ""},
   766  		{"CRTValue.R", Field, 0, ""},
   767  		{"DecryptOAEP", Func, 0, "func(hash hash.Hash, random io.Reader, priv *PrivateKey, ciphertext []byte, label []byte) ([]byte, error)"},
   768  		{"DecryptPKCS1v15", Func, 0, "func(random io.Reader, priv *PrivateKey, ciphertext []byte) ([]byte, error)"},
   769  		{"DecryptPKCS1v15SessionKey", Func, 0, "func(random io.Reader, priv *PrivateKey, ciphertext []byte, key []byte) error"},
   770  		{"EncryptOAEP", Func, 0, "func(hash hash.Hash, random io.Reader, pub *PublicKey, msg []byte, label []byte) ([]byte, error)"},
   771  		{"EncryptPKCS1v15", Func, 0, "func(random io.Reader, pub *PublicKey, msg []byte) ([]byte, error)"},
   772  		{"ErrDecryption", Var, 0, ""},
   773  		{"ErrMessageTooLong", Var, 0, ""},
   774  		{"ErrVerification", Var, 0, ""},
   775  		{"GenerateKey", Func, 0, "func(random io.Reader, bits int) (*PrivateKey, error)"},
   776  		{"GenerateMultiPrimeKey", Func, 0, "func(random io.Reader, nprimes int, bits int) (*PrivateKey, error)"},
   777  		{"OAEPOptions", Type, 5, ""},
   778  		{"OAEPOptions.Hash", Field, 5, ""},
   779  		{"OAEPOptions.Label", Field, 5, ""},
   780  		{"OAEPOptions.MGFHash", Field, 20, ""},
   781  		{"PKCS1v15DecryptOptions", Type, 5, ""},
   782  		{"PKCS1v15DecryptOptions.SessionKeyLen", Field, 5, ""},
   783  		{"PSSOptions", Type, 2, ""},
   784  		{"PSSOptions.Hash", Field, 4, ""},
   785  		{"PSSOptions.SaltLength", Field, 2, ""},
   786  		{"PSSSaltLengthAuto", Const, 2, ""},
   787  		{"PSSSaltLengthEqualsHash", Const, 2, ""},
   788  		{"PrecomputedValues", Type, 0, ""},
   789  		{"PrecomputedValues.CRTValues", Field, 0, ""},
   790  		{"PrecomputedValues.Dp", Field, 0, ""},
   791  		{"PrecomputedValues.Dq", Field, 0, ""},
   792  		{"PrecomputedValues.Qinv", Field, 0, ""},
   793  		{"PrivateKey", Type, 0, ""},
   794  		{"PrivateKey.D", Field, 0, ""},
   795  		{"PrivateKey.Precomputed", Field, 0, ""},
   796  		{"PrivateKey.Primes", Field, 0, ""},
   797  		{"PrivateKey.PublicKey", Field, 0, ""},
   798  		{"PublicKey", Type, 0, ""},
   799  		{"PublicKey.E", Field, 0, ""},
   800  		{"PublicKey.N", Field, 0, ""},
   801  		{"SignPKCS1v15", Func, 0, "func(random io.Reader, priv *PrivateKey, hash crypto.Hash, hashed []byte) ([]byte, error)"},
   802  		{"SignPSS", Func, 2, "func(rand io.Reader, priv *PrivateKey, hash crypto.Hash, digest []byte, opts *PSSOptions) ([]byte, error)"},
   803  		{"VerifyPKCS1v15", Func, 0, "func(pub *PublicKey, hash crypto.Hash, hashed []byte, sig []byte) error"},
   804  		{"VerifyPSS", Func, 2, "func(pub *PublicKey, hash crypto.Hash, digest []byte, sig []byte, opts *PSSOptions) error"},
   805  	},
   806  	"crypto/sha1": {
   807  		{"BlockSize", Const, 0, ""},
   808  		{"New", Func, 0, "func() hash.Hash"},
   809  		{"Size", Const, 0, ""},
   810  		{"Sum", Func, 2, "func(data []byte) [20]byte"},
   811  	},
   812  	"crypto/sha256": {
   813  		{"BlockSize", Const, 0, ""},
   814  		{"New", Func, 0, "func() hash.Hash"},
   815  		{"New224", Func, 0, "func() hash.Hash"},
   816  		{"Size", Const, 0, ""},
   817  		{"Size224", Const, 0, ""},
   818  		{"Sum224", Func, 2, "func(data []byte) [28]byte"},
   819  		{"Sum256", Func, 2, "func(data []byte) [32]byte"},
   820  	},
   821  	"crypto/sha3": {
   822  		{"(*SHA3).AppendBinary", Method, 24, ""},
   823  		{"(*SHA3).BlockSize", Method, 24, ""},
   824  		{"(*SHA3).Clone", Method, 25, ""},
   825  		{"(*SHA3).MarshalBinary", Method, 24, ""},
   826  		{"(*SHA3).Reset", Method, 24, ""},
   827  		{"(*SHA3).Size", Method, 24, ""},
   828  		{"(*SHA3).Sum", Method, 24, ""},
   829  		{"(*SHA3).UnmarshalBinary", Method, 24, ""},
   830  		{"(*SHA3).Write", Method, 24, ""},
   831  		{"(*SHAKE).AppendBinary", Method, 24, ""},
   832  		{"(*SHAKE).BlockSize", Method, 24, ""},
   833  		{"(*SHAKE).MarshalBinary", Method, 24, ""},
   834  		{"(*SHAKE).Read", Method, 24, ""},
   835  		{"(*SHAKE).Reset", Method, 24, ""},
   836  		{"(*SHAKE).UnmarshalBinary", Method, 24, ""},
   837  		{"(*SHAKE).Write", Method, 24, ""},
   838  		{"New224", Func, 24, "func() *SHA3"},
   839  		{"New256", Func, 24, "func() *SHA3"},
   840  		{"New384", Func, 24, "func() *SHA3"},
   841  		{"New512", Func, 24, "func() *SHA3"},
   842  		{"NewCSHAKE128", Func, 24, "func(N []byte, S []byte) *SHAKE"},
   843  		{"NewCSHAKE256", Func, 24, "func(N []byte, S []byte) *SHAKE"},
   844  		{"NewSHAKE128", Func, 24, "func() *SHAKE"},
   845  		{"NewSHAKE256", Func, 24, "func() *SHAKE"},
   846  		{"SHA3", Type, 24, ""},
   847  		{"SHAKE", Type, 24, ""},
   848  		{"Sum224", Func, 24, "func(data []byte) [28]byte"},
   849  		{"Sum256", Func, 24, "func(data []byte) [32]byte"},
   850  		{"Sum384", Func, 24, "func(data []byte) [48]byte"},
   851  		{"Sum512", Func, 24, "func(data []byte) [64]byte"},
   852  		{"SumSHAKE128", Func, 24, "func(data []byte, length int) []byte"},
   853  		{"SumSHAKE256", Func, 24, "func(data []byte, length int) []byte"},
   854  	},
   855  	"crypto/sha512": {
   856  		{"BlockSize", Const, 0, ""},
   857  		{"New", Func, 0, "func() hash.Hash"},
   858  		{"New384", Func, 0, "func() hash.Hash"},
   859  		{"New512_224", Func, 5, "func() hash.Hash"},
   860  		{"New512_256", Func, 5, "func() hash.Hash"},
   861  		{"Size", Const, 0, ""},
   862  		{"Size224", Const, 5, ""},
   863  		{"Size256", Const, 5, ""},
   864  		{"Size384", Const, 0, ""},
   865  		{"Sum384", Func, 2, "func(data []byte) [48]byte"},
   866  		{"Sum512", Func, 2, "func(data []byte) [64]byte"},
   867  		{"Sum512_224", Func, 5, "func(data []byte) [28]byte"},
   868  		{"Sum512_256", Func, 5, "func(data []byte) [32]byte"},
   869  	},
   870  	"crypto/subtle": {
   871  		{"ConstantTimeByteEq", Func, 0, "func(x uint8, y uint8) int"},
   872  		{"ConstantTimeCompare", Func, 0, "func(x []byte, y []byte) int"},
   873  		{"ConstantTimeCopy", Func, 0, "func(v int, x []byte, y []byte)"},
   874  		{"ConstantTimeEq", Func, 0, "func(x int32, y int32) int"},
   875  		{"ConstantTimeLessOrEq", Func, 2, "func(x int, y int) int"},
   876  		{"ConstantTimeSelect", Func, 0, "func(v int, x int, y int) int"},
   877  		{"WithDataIndependentTiming", Func, 24, "func(f func())"},
   878  		{"XORBytes", Func, 20, "func(dst []byte, x []byte, y []byte) int"},
   879  	},
   880  	"crypto/tls": {
   881  		{"(*CertificateRequestInfo).Context", Method, 17, ""},
   882  		{"(*CertificateRequestInfo).SupportsCertificate", Method, 14, ""},
   883  		{"(*CertificateVerificationError).Error", Method, 20, ""},
   884  		{"(*CertificateVerificationError).Unwrap", Method, 20, ""},
   885  		{"(*ClientHelloInfo).Context", Method, 17, ""},
   886  		{"(*ClientHelloInfo).SupportsCertificate", Method, 14, ""},
   887  		{"(*ClientSessionState).ResumptionState", Method, 21, ""},
   888  		{"(*Config).BuildNameToCertificate", Method, 0, ""},
   889  		{"(*Config).Clone", Method, 8, ""},
   890  		{"(*Config).DecryptTicket", Method, 21, ""},
   891  		{"(*Config).EncryptTicket", Method, 21, ""},
   892  		{"(*Config).SetSessionTicketKeys", Method, 5, ""},
   893  		{"(*Conn).Close", Method, 0, ""},
   894  		{"(*Conn).CloseWrite", Method, 8, ""},
   895  		{"(*Conn).ConnectionState", Method, 0, ""},
   896  		{"(*Conn).Handshake", Method, 0, ""},
   897  		{"(*Conn).HandshakeContext", Method, 17, ""},
   898  		{"(*Conn).LocalAddr", Method, 0, ""},
   899  		{"(*Conn).NetConn", Method, 18, ""},
   900  		{"(*Conn).OCSPResponse", Method, 0, ""},
   901  		{"(*Conn).Read", Method, 0, ""},
   902  		{"(*Conn).RemoteAddr", Method, 0, ""},
   903  		{"(*Conn).SetDeadline", Method, 0, ""},
   904  		{"(*Conn).SetReadDeadline", Method, 0, ""},
   905  		{"(*Conn).SetWriteDeadline", Method, 0, ""},
   906  		{"(*Conn).VerifyHostname", Method, 0, ""},
   907  		{"(*Conn).Write", Method, 0, ""},
   908  		{"(*ConnectionState).ExportKeyingMaterial", Method, 11, ""},
   909  		{"(*Dialer).Dial", Method, 15, ""},
   910  		{"(*Dialer).DialContext", Method, 15, ""},
   911  		{"(*ECHRejectionError).Error", Method, 23, ""},
   912  		{"(*QUICConn).Close", Method, 21, ""},
   913  		{"(*QUICConn).ConnectionState", Method, 21, ""},
   914  		{"(*QUICConn).HandleData", Method, 21, ""},
   915  		{"(*QUICConn).NextEvent", Method, 21, ""},
   916  		{"(*QUICConn).SendSessionTicket", Method, 21, ""},
   917  		{"(*QUICConn).SetTransportParameters", Method, 21, ""},
   918  		{"(*QUICConn).Start", Method, 21, ""},
   919  		{"(*QUICConn).StoreSession", Method, 23, ""},
   920  		{"(*SessionState).Bytes", Method, 21, ""},
   921  		{"(AlertError).Error", Method, 21, ""},
   922  		{"(ClientAuthType).String", Method, 15, ""},
   923  		{"(CurveID).String", Method, 15, ""},
   924  		{"(QUICEncryptionLevel).String", Method, 21, ""},
   925  		{"(RecordHeaderError).Error", Method, 6, ""},
   926  		{"(SignatureScheme).String", Method, 15, ""},
   927  		{"AlertError", Type, 21, ""},
   928  		{"Certificate", Type, 0, ""},
   929  		{"Certificate.Certificate", Field, 0, ""},
   930  		{"Certificate.Leaf", Field, 0, ""},
   931  		{"Certificate.OCSPStaple", Field, 0, ""},
   932  		{"Certificate.PrivateKey", Field, 0, ""},
   933  		{"Certificate.SignedCertificateTimestamps", Field, 5, ""},
   934  		{"Certificate.SupportedSignatureAlgorithms", Field, 14, ""},
   935  		{"CertificateRequestInfo", Type, 8, ""},
   936  		{"CertificateRequestInfo.AcceptableCAs", Field, 8, ""},
   937  		{"CertificateRequestInfo.SignatureSchemes", Field, 8, ""},
   938  		{"CertificateRequestInfo.Version", Field, 14, ""},
   939  		{"CertificateVerificationError", Type, 20, ""},
   940  		{"CertificateVerificationError.Err", Field, 20, ""},
   941  		{"CertificateVerificationError.UnverifiedCertificates", Field, 20, ""},
   942  		{"CipherSuite", Type, 14, ""},
   943  		{"CipherSuite.ID", Field, 14, ""},
   944  		{"CipherSuite.Insecure", Field, 14, ""},
   945  		{"CipherSuite.Name", Field, 14, ""},
   946  		{"CipherSuite.SupportedVersions", Field, 14, ""},
   947  		{"CipherSuiteName", Func, 14, "func(id uint16) string"},
   948  		{"CipherSuites", Func, 14, "func() []*CipherSuite"},
   949  		{"Client", Func, 0, "func(conn net.Conn, config *Config) *Conn"},
   950  		{"ClientAuthType", Type, 0, ""},
   951  		{"ClientHelloInfo", Type, 4, ""},
   952  		{"ClientHelloInfo.CipherSuites", Field, 4, ""},
   953  		{"ClientHelloInfo.Conn", Field, 8, ""},
   954  		{"ClientHelloInfo.Extensions", Field, 24, ""},
   955  		{"ClientHelloInfo.ServerName", Field, 4, ""},
   956  		{"ClientHelloInfo.SignatureSchemes", Field, 8, ""},
   957  		{"ClientHelloInfo.SupportedCurves", Field, 4, ""},
   958  		{"ClientHelloInfo.SupportedPoints", Field, 4, ""},
   959  		{"ClientHelloInfo.SupportedProtos", Field, 8, ""},
   960  		{"ClientHelloInfo.SupportedVersions", Field, 8, ""},
   961  		{"ClientSessionCache", Type, 3, ""},
   962  		{"ClientSessionState", Type, 3, ""},
   963  		{"Config", Type, 0, ""},
   964  		{"Config.Certificates", Field, 0, ""},
   965  		{"Config.CipherSuites", Field, 0, ""},
   966  		{"Config.ClientAuth", Field, 0, ""},
   967  		{"Config.ClientCAs", Field, 0, ""},
   968  		{"Config.ClientSessionCache", Field, 3, ""},
   969  		{"Config.CurvePreferences", Field, 3, ""},
   970  		{"Config.DynamicRecordSizingDisabled", Field, 7, ""},
   971  		{"Config.EncryptedClientHelloConfigList", Field, 23, ""},
   972  		{"Config.EncryptedClientHelloKeys", Field, 24, ""},
   973  		{"Config.EncryptedClientHelloRejectionVerify", Field, 23, ""},
   974  		{"Config.GetCertificate", Field, 4, ""},
   975  		{"Config.GetClientCertificate", Field, 8, ""},
   976  		{"Config.GetConfigForClient", Field, 8, ""},
   977  		{"Config.GetEncryptedClientHelloKeys", Field, 25, ""},
   978  		{"Config.InsecureSkipVerify", Field, 0, ""},
   979  		{"Config.KeyLogWriter", Field, 8, ""},
   980  		{"Config.MaxVersion", Field, 2, ""},
   981  		{"Config.MinVersion", Field, 2, ""},
   982  		{"Config.NameToCertificate", Field, 0, ""},
   983  		{"Config.NextProtos", Field, 0, ""},
   984  		{"Config.PreferServerCipherSuites", Field, 1, ""},
   985  		{"Config.Rand", Field, 0, ""},
   986  		{"Config.Renegotiation", Field, 7, ""},
   987  		{"Config.RootCAs", Field, 0, ""},
   988  		{"Config.ServerName", Field, 0, ""},
   989  		{"Config.SessionTicketKey", Field, 1, ""},
   990  		{"Config.SessionTicketsDisabled", Field, 1, ""},
   991  		{"Config.Time", Field, 0, ""},
   992  		{"Config.UnwrapSession", Field, 21, ""},
   993  		{"Config.VerifyConnection", Field, 15, ""},
   994  		{"Config.VerifyPeerCertificate", Field, 8, ""},
   995  		{"Config.WrapSession", Field, 21, ""},
   996  		{"Conn", Type, 0, ""},
   997  		{"ConnectionState", Type, 0, ""},
   998  		{"ConnectionState.CipherSuite", Field, 0, ""},
   999  		{"ConnectionState.CurveID", Field, 25, ""},
  1000  		{"ConnectionState.DidResume", Field, 1, ""},
  1001  		{"ConnectionState.ECHAccepted", Field, 23, ""},
  1002  		{"ConnectionState.HandshakeComplete", Field, 0, ""},
  1003  		{"ConnectionState.NegotiatedProtocol", Field, 0, ""},
  1004  		{"ConnectionState.NegotiatedProtocolIsMutual", Field, 0, ""},
  1005  		{"ConnectionState.OCSPResponse", Field, 5, ""},
  1006  		{"ConnectionState.PeerCertificates", Field, 0, ""},
  1007  		{"ConnectionState.ServerName", Field, 0, ""},
  1008  		{"ConnectionState.SignedCertificateTimestamps", Field, 5, ""},
  1009  		{"ConnectionState.TLSUnique", Field, 4, ""},
  1010  		{"ConnectionState.VerifiedChains", Field, 0, ""},
  1011  		{"ConnectionState.Version", Field, 3, ""},
  1012  		{"CurveID", Type, 3, ""},
  1013  		{"CurveP256", Const, 3, ""},
  1014  		{"CurveP384", Const, 3, ""},
  1015  		{"CurveP521", Const, 3, ""},
  1016  		{"Dial", Func, 0, "func(network string, addr string, config *Config) (*Conn, error)"},
  1017  		{"DialWithDialer", Func, 3, "func(dialer *net.Dialer, network string, addr string, config *Config) (*Conn, error)"},
  1018  		{"Dialer", Type, 15, ""},
  1019  		{"Dialer.Config", Field, 15, ""},
  1020  		{"Dialer.NetDialer", Field, 15, ""},
  1021  		{"ECDSAWithP256AndSHA256", Const, 8, ""},
  1022  		{"ECDSAWithP384AndSHA384", Const, 8, ""},
  1023  		{"ECDSAWithP521AndSHA512", Const, 8, ""},
  1024  		{"ECDSAWithSHA1", Const, 10, ""},
  1025  		{"ECHRejectionError", Type, 23, ""},
  1026  		{"ECHRejectionError.RetryConfigList", Field, 23, ""},
  1027  		{"Ed25519", Const, 13, ""},
  1028  		{"EncryptedClientHelloKey", Type, 24, ""},
  1029  		{"EncryptedClientHelloKey.Config", Field, 24, ""},
  1030  		{"EncryptedClientHelloKey.PrivateKey", Field, 24, ""},
  1031  		{"EncryptedClientHelloKey.SendAsRetry", Field, 24, ""},
  1032  		{"InsecureCipherSuites", Func, 14, "func() []*CipherSuite"},
  1033  		{"Listen", Func, 0, "func(network string, laddr string, config *Config) (net.Listener, error)"},
  1034  		{"LoadX509KeyPair", Func, 0, "func(certFile string, keyFile string) (Certificate, error)"},
  1035  		{"NewLRUClientSessionCache", Func, 3, "func(capacity int) ClientSessionCache"},
  1036  		{"NewListener", Func, 0, "func(inner net.Listener, config *Config) net.Listener"},
  1037  		{"NewResumptionState", Func, 21, "func(ticket []byte, state *SessionState) (*ClientSessionState, error)"},
  1038  		{"NoClientCert", Const, 0, ""},
  1039  		{"PKCS1WithSHA1", Const, 8, ""},
  1040  		{"PKCS1WithSHA256", Const, 8, ""},
  1041  		{"PKCS1WithSHA384", Const, 8, ""},
  1042  		{"PKCS1WithSHA512", Const, 8, ""},
  1043  		{"PSSWithSHA256", Const, 8, ""},
  1044  		{"PSSWithSHA384", Const, 8, ""},
  1045  		{"PSSWithSHA512", Const, 8, ""},
  1046  		{"ParseSessionState", Func, 21, "func(data []byte) (*SessionState, error)"},
  1047  		{"QUICClient", Func, 21, "func(config *QUICConfig) *QUICConn"},
  1048  		{"QUICConfig", Type, 21, ""},
  1049  		{"QUICConfig.EnableSessionEvents", Field, 23, ""},
  1050  		{"QUICConfig.TLSConfig", Field, 21, ""},
  1051  		{"QUICConn", Type, 21, ""},
  1052  		{"QUICEncryptionLevel", Type, 21, ""},
  1053  		{"QUICEncryptionLevelApplication", Const, 21, ""},
  1054  		{"QUICEncryptionLevelEarly", Const, 21, ""},
  1055  		{"QUICEncryptionLevelHandshake", Const, 21, ""},
  1056  		{"QUICEncryptionLevelInitial", Const, 21, ""},
  1057  		{"QUICEvent", Type, 21, ""},
  1058  		{"QUICEvent.Data", Field, 21, ""},
  1059  		{"QUICEvent.Kind", Field, 21, ""},
  1060  		{"QUICEvent.Level", Field, 21, ""},
  1061  		{"QUICEvent.SessionState", Field, 23, ""},
  1062  		{"QUICEvent.Suite", Field, 21, ""},
  1063  		{"QUICEventKind", Type, 21, ""},
  1064  		{"QUICHandshakeDone", Const, 21, ""},
  1065  		{"QUICNoEvent", Const, 21, ""},
  1066  		{"QUICRejectedEarlyData", Const, 21, ""},
  1067  		{"QUICResumeSession", Const, 23, ""},
  1068  		{"QUICServer", Func, 21, "func(config *QUICConfig) *QUICConn"},
  1069  		{"QUICSessionTicketOptions", Type, 21, ""},
  1070  		{"QUICSessionTicketOptions.EarlyData", Field, 21, ""},
  1071  		{"QUICSessionTicketOptions.Extra", Field, 23, ""},
  1072  		{"QUICSetReadSecret", Const, 21, ""},
  1073  		{"QUICSetWriteSecret", Const, 21, ""},
  1074  		{"QUICStoreSession", Const, 23, ""},
  1075  		{"QUICTransportParameters", Const, 21, ""},
  1076  		{"QUICTransportParametersRequired", Const, 21, ""},
  1077  		{"QUICWriteData", Const, 21, ""},
  1078  		{"RecordHeaderError", Type, 6, ""},
  1079  		{"RecordHeaderError.Conn", Field, 12, ""},
  1080  		{"RecordHeaderError.Msg", Field, 6, ""},
  1081  		{"RecordHeaderError.RecordHeader", Field, 6, ""},
  1082  		{"RenegotiateFreelyAsClient", Const, 7, ""},
  1083  		{"RenegotiateNever", Const, 7, ""},
  1084  		{"RenegotiateOnceAsClient", Const, 7, ""},
  1085  		{"RenegotiationSupport", Type, 7, ""},
  1086  		{"RequestClientCert", Const, 0, ""},
  1087  		{"RequireAndVerifyClientCert", Const, 0, ""},
  1088  		{"RequireAnyClientCert", Const, 0, ""},
  1089  		{"Server", Func, 0, "func(conn net.Conn, config *Config) *Conn"},
  1090  		{"SessionState", Type, 21, ""},
  1091  		{"SessionState.EarlyData", Field, 21, ""},
  1092  		{"SessionState.Extra", Field, 21, ""},
  1093  		{"SignatureScheme", Type, 8, ""},
  1094  		{"TLS_AES_128_GCM_SHA256", Const, 12, ""},
  1095  		{"TLS_AES_256_GCM_SHA384", Const, 12, ""},
  1096  		{"TLS_CHACHA20_POLY1305_SHA256", Const, 12, ""},
  1097  		{"TLS_ECDHE_ECDSA_WITH_AES_128_CBC_SHA", Const, 2, ""},
  1098  		{"TLS_ECDHE_ECDSA_WITH_AES_128_CBC_SHA256", Const, 8, ""},
  1099  		{"TLS_ECDHE_ECDSA_WITH_AES_128_GCM_SHA256", Const, 2, ""},
  1100  		{"TLS_ECDHE_ECDSA_WITH_AES_256_CBC_SHA", Const, 2, ""},
  1101  		{"TLS_ECDHE_ECDSA_WITH_AES_256_GCM_SHA384", Const, 5, ""},
  1102  		{"TLS_ECDHE_ECDSA_WITH_CHACHA20_POLY1305", Const, 8, ""},
  1103  		{"TLS_ECDHE_ECDSA_WITH_CHACHA20_POLY1305_SHA256", Const, 14, ""},
  1104  		{"TLS_ECDHE_ECDSA_WITH_RC4_128_SHA", Const, 2, ""},
  1105  		{"TLS_ECDHE_RSA_WITH_3DES_EDE_CBC_SHA", Const, 0, ""},
  1106  		{"TLS_ECDHE_RSA_WITH_AES_128_CBC_SHA", Const, 0, ""},
  1107  		{"TLS_ECDHE_RSA_WITH_AES_128_CBC_SHA256", Const, 8, ""},
  1108  		{"TLS_ECDHE_RSA_WITH_AES_128_GCM_SHA256", Const, 2, ""},
  1109  		{"TLS_ECDHE_RSA_WITH_AES_256_CBC_SHA", Const, 1, ""},
  1110  		{"TLS_ECDHE_RSA_WITH_AES_256_GCM_SHA384", Const, 5, ""},
  1111  		{"TLS_ECDHE_RSA_WITH_CHACHA20_POLY1305", Const, 8, ""},
  1112  		{"TLS_ECDHE_RSA_WITH_CHACHA20_POLY1305_SHA256", Const, 14, ""},
  1113  		{"TLS_ECDHE_RSA_WITH_RC4_128_SHA", Const, 0, ""},
  1114  		{"TLS_FALLBACK_SCSV", Const, 4, ""},
  1115  		{"TLS_RSA_WITH_3DES_EDE_CBC_SHA", Const, 0, ""},
  1116  		{"TLS_RSA_WITH_AES_128_CBC_SHA", Const, 0, ""},
  1117  		{"TLS_RSA_WITH_AES_128_CBC_SHA256", Const, 8, ""},
  1118  		{"TLS_RSA_WITH_AES_128_GCM_SHA256", Const, 6, ""},
  1119  		{"TLS_RSA_WITH_AES_256_CBC_SHA", Const, 1, ""},
  1120  		{"TLS_RSA_WITH_AES_256_GCM_SHA384", Const, 6, ""},
  1121  		{"TLS_RSA_WITH_RC4_128_SHA", Const, 0, ""},
  1122  		{"VerifyClientCertIfGiven", Const, 0, ""},
  1123  		{"VersionName", Func, 21, "func(version uint16) string"},
  1124  		{"VersionSSL30", Const, 2, ""},
  1125  		{"VersionTLS10", Const, 2, ""},
  1126  		{"VersionTLS11", Const, 2, ""},
  1127  		{"VersionTLS12", Const, 2, ""},
  1128  		{"VersionTLS13", Const, 12, ""},
  1129  		{"X25519", Const, 8, ""},
  1130  		{"X25519MLKEM768", Const, 24, ""},
  1131  		{"X509KeyPair", Func, 0, "func(certPEMBlock []byte, keyPEMBlock []byte) (Certificate, error)"},
  1132  	},
  1133  	"crypto/x509": {
  1134  		{"(*CertPool).AddCert", Method, 0, ""},
  1135  		{"(*CertPool).AddCertWithConstraint", Method, 22, ""},
  1136  		{"(*CertPool).AppendCertsFromPEM", Method, 0, ""},
  1137  		{"(*CertPool).Clone", Method, 19, ""},
  1138  		{"(*CertPool).Equal", Method, 19, ""},
  1139  		{"(*CertPool).Subjects", Method, 0, ""},
  1140  		{"(*Certificate).CheckCRLSignature", Method, 0, ""},
  1141  		{"(*Certificate).CheckSignature", Method, 0, ""},
  1142  		{"(*Certificate).CheckSignatureFrom", Method, 0, ""},
  1143  		{"(*Certificate).CreateCRL", Method, 0, ""},
  1144  		{"(*Certificate).Equal", Method, 0, ""},
  1145  		{"(*Certificate).Verify", Method, 0, ""},
  1146  		{"(*Certificate).VerifyHostname", Method, 0, ""},
  1147  		{"(*CertificateRequest).CheckSignature", Method, 5, ""},
  1148  		{"(*OID).UnmarshalBinary", Method, 23, ""},
  1149  		{"(*OID).UnmarshalText", Method, 23, ""},
  1150  		{"(*RevocationList).CheckSignatureFrom", Method, 19, ""},
  1151  		{"(CertificateInvalidError).Error", Method, 0, ""},
  1152  		{"(ConstraintViolationError).Error", Method, 0, ""},
  1153  		{"(HostnameError).Error", Method, 0, ""},
  1154  		{"(InsecureAlgorithmError).Error", Method, 6, ""},
  1155  		{"(OID).AppendBinary", Method, 24, ""},
  1156  		{"(OID).AppendText", Method, 24, ""},
  1157  		{"(OID).Equal", Method, 22, ""},
  1158  		{"(OID).EqualASN1OID", Method, 22, ""},
  1159  		{"(OID).MarshalBinary", Method, 23, ""},
  1160  		{"(OID).MarshalText", Method, 23, ""},
  1161  		{"(OID).String", Method, 22, ""},
  1162  		{"(PublicKeyAlgorithm).String", Method, 10, ""},
  1163  		{"(SignatureAlgorithm).String", Method, 6, ""},
  1164  		{"(SystemRootsError).Error", Method, 1, ""},
  1165  		{"(SystemRootsError).Unwrap", Method, 16, ""},
  1166  		{"(UnhandledCriticalExtension).Error", Method, 0, ""},
  1167  		{"(UnknownAuthorityError).Error", Method, 0, ""},
  1168  		{"CANotAuthorizedForExtKeyUsage", Const, 10, ""},
  1169  		{"CANotAuthorizedForThisName", Const, 0, ""},
  1170  		{"CertPool", Type, 0, ""},
  1171  		{"Certificate", Type, 0, ""},
  1172  		{"Certificate.AuthorityKeyId", Field, 0, ""},
  1173  		{"Certificate.BasicConstraintsValid", Field, 0, ""},
  1174  		{"Certificate.CRLDistributionPoints", Field, 2, ""},
  1175  		{"Certificate.DNSNames", Field, 0, ""},
  1176  		{"Certificate.EmailAddresses", Field, 0, ""},
  1177  		{"Certificate.ExcludedDNSDomains", Field, 9, ""},
  1178  		{"Certificate.ExcludedEmailAddresses", Field, 10, ""},
  1179  		{"Certificate.ExcludedIPRanges", Field, 10, ""},
  1180  		{"Certificate.ExcludedURIDomains", Field, 10, ""},
  1181  		{"Certificate.ExtKeyUsage", Field, 0, ""},
  1182  		{"Certificate.Extensions", Field, 2, ""},
  1183  		{"Certificate.ExtraExtensions", Field, 2, ""},
  1184  		{"Certificate.IPAddresses", Field, 1, ""},
  1185  		{"Certificate.InhibitAnyPolicy", Field, 24, ""},
  1186  		{"Certificate.InhibitAnyPolicyZero", Field, 24, ""},
  1187  		{"Certificate.InhibitPolicyMapping", Field, 24, ""},
  1188  		{"Certificate.InhibitPolicyMappingZero", Field, 24, ""},
  1189  		{"Certificate.IsCA", Field, 0, ""},
  1190  		{"Certificate.Issuer", Field, 0, ""},
  1191  		{"Certificate.IssuingCertificateURL", Field, 2, ""},
  1192  		{"Certificate.KeyUsage", Field, 0, ""},
  1193  		{"Certificate.MaxPathLen", Field, 0, ""},
  1194  		{"Certificate.MaxPathLenZero", Field, 4, ""},
  1195  		{"Certificate.NotAfter", Field, 0, ""},
  1196  		{"Certificate.NotBefore", Field, 0, ""},
  1197  		{"Certificate.OCSPServer", Field, 2, ""},
  1198  		{"Certificate.PermittedDNSDomains", Field, 0, ""},
  1199  		{"Certificate.PermittedDNSDomainsCritical", Field, 0, ""},
  1200  		{"Certificate.PermittedEmailAddresses", Field, 10, ""},
  1201  		{"Certificate.PermittedIPRanges", Field, 10, ""},
  1202  		{"Certificate.PermittedURIDomains", Field, 10, ""},
  1203  		{"Certificate.Policies", Field, 22, ""},
  1204  		{"Certificate.PolicyIdentifiers", Field, 0, ""},
  1205  		{"Certificate.PolicyMappings", Field, 24, ""},
  1206  		{"Certificate.PublicKey", Field, 0, ""},
  1207  		{"Certificate.PublicKeyAlgorithm", Field, 0, ""},
  1208  		{"Certificate.Raw", Field, 0, ""},
  1209  		{"Certificate.RawIssuer", Field, 0, ""},
  1210  		{"Certificate.RawSubject", Field, 0, ""},
  1211  		{"Certificate.RawSubjectPublicKeyInfo", Field, 0, ""},
  1212  		{"Certificate.RawTBSCertificate", Field, 0, ""},
  1213  		{"Certificate.RequireExplicitPolicy", Field, 24, ""},
  1214  		{"Certificate.RequireExplicitPolicyZero", Field, 24, ""},
  1215  		{"Certificate.SerialNumber", Field, 0, ""},
  1216  		{"Certificate.Signature", Field, 0, ""},
  1217  		{"Certificate.SignatureAlgorithm", Field, 0, ""},
  1218  		{"Certificate.Subject", Field, 0, ""},
  1219  		{"Certificate.SubjectKeyId", Field, 0, ""},
  1220  		{"Certificate.URIs", Field, 10, ""},
  1221  		{"Certificate.UnhandledCriticalExtensions", Field, 5, ""},
  1222  		{"Certificate.UnknownExtKeyUsage", Field, 0, ""},
  1223  		{"Certificate.Version", Field, 0, ""},
  1224  		{"CertificateInvalidError", Type, 0, ""},
  1225  		{"CertificateInvalidError.Cert", Field, 0, ""},
  1226  		{"CertificateInvalidError.Detail", Field, 10, ""},
  1227  		{"CertificateInvalidError.Reason", Field, 0, ""},
  1228  		{"CertificateRequest", Type, 3, ""},
  1229  		{"CertificateRequest.Attributes", Field, 3, ""},
  1230  		{"CertificateRequest.DNSNames", Field, 3, ""},
  1231  		{"CertificateRequest.EmailAddresses", Field, 3, ""},
  1232  		{"CertificateRequest.Extensions", Field, 3, ""},
  1233  		{"CertificateRequest.ExtraExtensions", Field, 3, ""},
  1234  		{"CertificateRequest.IPAddresses", Field, 3, ""},
  1235  		{"CertificateRequest.PublicKey", Field, 3, ""},
  1236  		{"CertificateRequest.PublicKeyAlgorithm", Field, 3, ""},
  1237  		{"CertificateRequest.Raw", Field, 3, ""},
  1238  		{"CertificateRequest.RawSubject", Field, 3, ""},
  1239  		{"CertificateRequest.RawSubjectPublicKeyInfo", Field, 3, ""},
  1240  		{"CertificateRequest.RawTBSCertificateRequest", Field, 3, ""},
  1241  		{"CertificateRequest.Signature", Field, 3, ""},
  1242  		{"CertificateRequest.SignatureAlgorithm", Field, 3, ""},
  1243  		{"CertificateRequest.Subject", Field, 3, ""},
  1244  		{"CertificateRequest.URIs", Field, 10, ""},
  1245  		{"CertificateRequest.Version", Field, 3, ""},
  1246  		{"ConstraintViolationError", Type, 0, ""},
  1247  		{"CreateCertificate", Func, 0, "func(rand io.Reader, template *Certificate, parent *Certificate, pub any, priv any) ([]byte, error)"},
  1248  		{"CreateCertificateRequest", Func, 3, "func(rand io.Reader, template *CertificateRequest, priv any) (csr []byte, err error)"},
  1249  		{"CreateRevocationList", Func, 15, "func(rand io.Reader, template *RevocationList, issuer *Certificate, priv crypto.Signer) ([]byte, error)"},
  1250  		{"DSA", Const, 0, ""},
  1251  		{"DSAWithSHA1", Const, 0, ""},
  1252  		{"DSAWithSHA256", Const, 0, ""},
  1253  		{"DecryptPEMBlock", Func, 1, "func(b *pem.Block, password []byte) ([]byte, error)"},
  1254  		{"ECDSA", Const, 1, ""},
  1255  		{"ECDSAWithSHA1", Const, 1, ""},
  1256  		{"ECDSAWithSHA256", Const, 1, ""},
  1257  		{"ECDSAWithSHA384", Const, 1, ""},
  1258  		{"ECDSAWithSHA512", Const, 1, ""},
  1259  		{"Ed25519", Const, 13, ""},
  1260  		{"EncryptPEMBlock", Func, 1, "func(rand io.Reader, blockType string, data []byte, password []byte, alg PEMCipher) (*pem.Block, error)"},
  1261  		{"ErrUnsupportedAlgorithm", Var, 0, ""},
  1262  		{"Expired", Const, 0, ""},
  1263  		{"ExtKeyUsage", Type, 0, ""},
  1264  		{"ExtKeyUsageAny", Const, 0, ""},
  1265  		{"ExtKeyUsageClientAuth", Const, 0, ""},
  1266  		{"ExtKeyUsageCodeSigning", Const, 0, ""},
  1267  		{"ExtKeyUsageEmailProtection", Const, 0, ""},
  1268  		{"ExtKeyUsageIPSECEndSystem", Const, 1, ""},
  1269  		{"ExtKeyUsageIPSECTunnel", Const, 1, ""},
  1270  		{"ExtKeyUsageIPSECUser", Const, 1, ""},
  1271  		{"ExtKeyUsageMicrosoftCommercialCodeSigning", Const, 10, ""},
  1272  		{"ExtKeyUsageMicrosoftKernelCodeSigning", Const, 10, ""},
  1273  		{"ExtKeyUsageMicrosoftServerGatedCrypto", Const, 1, ""},
  1274  		{"ExtKeyUsageNetscapeServerGatedCrypto", Const, 1, ""},
  1275  		{"ExtKeyUsageOCSPSigning", Const, 0, ""},
  1276  		{"ExtKeyUsageServerAuth", Const, 0, ""},
  1277  		{"ExtKeyUsageTimeStamping", Const, 0, ""},
  1278  		{"HostnameError", Type, 0, ""},
  1279  		{"HostnameError.Certificate", Field, 0, ""},
  1280  		{"HostnameError.Host", Field, 0, ""},
  1281  		{"IncompatibleUsage", Const, 1, ""},
  1282  		{"IncorrectPasswordError", Var, 1, ""},
  1283  		{"InsecureAlgorithmError", Type, 6, ""},
  1284  		{"InvalidReason", Type, 0, ""},
  1285  		{"IsEncryptedPEMBlock", Func, 1, "func(b *pem.Block) bool"},
  1286  		{"KeyUsage", Type, 0, ""},
  1287  		{"KeyUsageCRLSign", Const, 0, ""},
  1288  		{"KeyUsageCertSign", Const, 0, ""},
  1289  		{"KeyUsageContentCommitment", Const, 0, ""},
  1290  		{"KeyUsageDataEncipherment", Const, 0, ""},
  1291  		{"KeyUsageDecipherOnly", Const, 0, ""},
  1292  		{"KeyUsageDigitalSignature", Const, 0, ""},
  1293  		{"KeyUsageEncipherOnly", Const, 0, ""},
  1294  		{"KeyUsageKeyAgreement", Const, 0, ""},
  1295  		{"KeyUsageKeyEncipherment", Const, 0, ""},
  1296  		{"MD2WithRSA", Const, 0, ""},
  1297  		{"MD5WithRSA", Const, 0, ""},
  1298  		{"MarshalECPrivateKey", Func, 2, "func(key *ecdsa.PrivateKey) ([]byte, error)"},
  1299  		{"MarshalPKCS1PrivateKey", Func, 0, "func(key *rsa.PrivateKey) []byte"},
  1300  		{"MarshalPKCS1PublicKey", Func, 10, "func(key *rsa.PublicKey) []byte"},
  1301  		{"MarshalPKCS8PrivateKey", Func, 10, "func(key any) ([]byte, error)"},
  1302  		{"MarshalPKIXPublicKey", Func, 0, "func(pub any) ([]byte, error)"},
  1303  		{"NameConstraintsWithoutSANs", Const, 10, ""},
  1304  		{"NameMismatch", Const, 8, ""},
  1305  		{"NewCertPool", Func, 0, "func() *CertPool"},
  1306  		{"NoValidChains", Const, 24, ""},
  1307  		{"NotAuthorizedToSign", Const, 0, ""},
  1308  		{"OID", Type, 22, ""},
  1309  		{"OIDFromInts", Func, 22, "func(oid []uint64) (OID, error)"},
  1310  		{"PEMCipher", Type, 1, ""},
  1311  		{"PEMCipher3DES", Const, 1, ""},
  1312  		{"PEMCipherAES128", Const, 1, ""},
  1313  		{"PEMCipherAES192", Const, 1, ""},
  1314  		{"PEMCipherAES256", Const, 1, ""},
  1315  		{"PEMCipherDES", Const, 1, ""},
  1316  		{"ParseCRL", Func, 0, "func(crlBytes []byte) (*pkix.CertificateList, error)"},
  1317  		{"ParseCertificate", Func, 0, "func(der []byte) (*Certificate, error)"},
  1318  		{"ParseCertificateRequest", Func, 3, "func(asn1Data []byte) (*CertificateRequest, error)"},
  1319  		{"ParseCertificates", Func, 0, "func(der []byte) ([]*Certificate, error)"},
  1320  		{"ParseDERCRL", Func, 0, "func(derBytes []byte) (*pkix.CertificateList, error)"},
  1321  		{"ParseECPrivateKey", Func, 1, "func(der []byte) (*ecdsa.PrivateKey, error)"},
  1322  		{"ParseOID", Func, 23, "func(oid string) (OID, error)"},
  1323  		{"ParsePKCS1PrivateKey", Func, 0, "func(der []byte) (*rsa.PrivateKey, error)"},
  1324  		{"ParsePKCS1PublicKey", Func, 10, "func(der []byte) (*rsa.PublicKey, error)"},
  1325  		{"ParsePKCS8PrivateKey", Func, 0, "func(der []byte) (key any, err error)"},
  1326  		{"ParsePKIXPublicKey", Func, 0, "func(derBytes []byte) (pub any, err error)"},
  1327  		{"ParseRevocationList", Func, 19, "func(der []byte) (*RevocationList, error)"},
  1328  		{"PolicyMapping", Type, 24, ""},
  1329  		{"PolicyMapping.IssuerDomainPolicy", Field, 24, ""},
  1330  		{"PolicyMapping.SubjectDomainPolicy", Field, 24, ""},
  1331  		{"PublicKeyAlgorithm", Type, 0, ""},
  1332  		{"PureEd25519", Const, 13, ""},
  1333  		{"RSA", Const, 0, ""},
  1334  		{"RevocationList", Type, 15, ""},
  1335  		{"RevocationList.AuthorityKeyId", Field, 19, ""},
  1336  		{"RevocationList.Extensions", Field, 19, ""},
  1337  		{"RevocationList.ExtraExtensions", Field, 15, ""},
  1338  		{"RevocationList.Issuer", Field, 19, ""},
  1339  		{"RevocationList.NextUpdate", Field, 15, ""},
  1340  		{"RevocationList.Number", Field, 15, ""},
  1341  		{"RevocationList.Raw", Field, 19, ""},
  1342  		{"RevocationList.RawIssuer", Field, 19, ""},
  1343  		{"RevocationList.RawTBSRevocationList", Field, 19, ""},
  1344  		{"RevocationList.RevokedCertificateEntries", Field, 21, ""},
  1345  		{"RevocationList.RevokedCertificates", Field, 15, ""},
  1346  		{"RevocationList.Signature", Field, 19, ""},
  1347  		{"RevocationList.SignatureAlgorithm", Field, 15, ""},
  1348  		{"RevocationList.ThisUpdate", Field, 15, ""},
  1349  		{"RevocationListEntry", Type, 21, ""},
  1350  		{"RevocationListEntry.Extensions", Field, 21, ""},
  1351  		{"RevocationListEntry.ExtraExtensions", Field, 21, ""},
  1352  		{"RevocationListEntry.Raw", Field, 21, ""},
  1353  		{"RevocationListEntry.ReasonCode", Field, 21, ""},
  1354  		{"RevocationListEntry.RevocationTime", Field, 21, ""},
  1355  		{"RevocationListEntry.SerialNumber", Field, 21, ""},
  1356  		{"SHA1WithRSA", Const, 0, ""},
  1357  		{"SHA256WithRSA", Const, 0, ""},
  1358  		{"SHA256WithRSAPSS", Const, 8, ""},
  1359  		{"SHA384WithRSA", Const, 0, ""},
  1360  		{"SHA384WithRSAPSS", Const, 8, ""},
  1361  		{"SHA512WithRSA", Const, 0, ""},
  1362  		{"SHA512WithRSAPSS", Const, 8, ""},
  1363  		{"SetFallbackRoots", Func, 20, "func(roots *CertPool)"},
  1364  		{"SignatureAlgorithm", Type, 0, ""},
  1365  		{"SystemCertPool", Func, 7, "func() (*CertPool, error)"},
  1366  		{"SystemRootsError", Type, 1, ""},
  1367  		{"SystemRootsError.Err", Field, 7, ""},
  1368  		{"TooManyConstraints", Const, 10, ""},
  1369  		{"TooManyIntermediates", Const, 0, ""},
  1370  		{"UnconstrainedName", Const, 10, ""},
  1371  		{"UnhandledCriticalExtension", Type, 0, ""},
  1372  		{"UnknownAuthorityError", Type, 0, ""},
  1373  		{"UnknownAuthorityError.Cert", Field, 8, ""},
  1374  		{"UnknownPublicKeyAlgorithm", Const, 0, ""},
  1375  		{"UnknownSignatureAlgorithm", Const, 0, ""},
  1376  		{"VerifyOptions", Type, 0, ""},
  1377  		{"VerifyOptions.CertificatePolicies", Field, 24, ""},
  1378  		{"VerifyOptions.CurrentTime", Field, 0, ""},
  1379  		{"VerifyOptions.DNSName", Field, 0, ""},
  1380  		{"VerifyOptions.Intermediates", Field, 0, ""},
  1381  		{"VerifyOptions.KeyUsages", Field, 1, ""},
  1382  		{"VerifyOptions.MaxConstraintComparisions", Field, 10, ""},
  1383  		{"VerifyOptions.Roots", Field, 0, ""},
  1384  	},
  1385  	"crypto/x509/pkix": {
  1386  		{"(*CertificateList).HasExpired", Method, 0, ""},
  1387  		{"(*Name).FillFromRDNSequence", Method, 0, ""},
  1388  		{"(Name).String", Method, 10, ""},
  1389  		{"(Name).ToRDNSequence", Method, 0, ""},
  1390  		{"(RDNSequence).String", Method, 10, ""},
  1391  		{"AlgorithmIdentifier", Type, 0, ""},
  1392  		{"AlgorithmIdentifier.Algorithm", Field, 0, ""},
  1393  		{"AlgorithmIdentifier.Parameters", Field, 0, ""},
  1394  		{"AttributeTypeAndValue", Type, 0, ""},
  1395  		{"AttributeTypeAndValue.Type", Field, 0, ""},
  1396  		{"AttributeTypeAndValue.Value", Field, 0, ""},
  1397  		{"AttributeTypeAndValueSET", Type, 3, ""},
  1398  		{"AttributeTypeAndValueSET.Type", Field, 3, ""},
  1399  		{"AttributeTypeAndValueSET.Value", Field, 3, ""},
  1400  		{"CertificateList", Type, 0, ""},
  1401  		{"CertificateList.SignatureAlgorithm", Field, 0, ""},
  1402  		{"CertificateList.SignatureValue", Field, 0, ""},
  1403  		{"CertificateList.TBSCertList", Field, 0, ""},
  1404  		{"Extension", Type, 0, ""},
  1405  		{"Extension.Critical", Field, 0, ""},
  1406  		{"Extension.Id", Field, 0, ""},
  1407  		{"Extension.Value", Field, 0, ""},
  1408  		{"Name", Type, 0, ""},
  1409  		{"Name.CommonName", Field, 0, ""},
  1410  		{"Name.Country", Field, 0, ""},
  1411  		{"Name.ExtraNames", Field, 5, ""},
  1412  		{"Name.Locality", Field, 0, ""},
  1413  		{"Name.Names", Field, 0, ""},
  1414  		{"Name.Organization", Field, 0, ""},
  1415  		{"Name.OrganizationalUnit", Field, 0, ""},
  1416  		{"Name.PostalCode", Field, 0, ""},
  1417  		{"Name.Province", Field, 0, ""},
  1418  		{"Name.SerialNumber", Field, 0, ""},
  1419  		{"Name.StreetAddress", Field, 0, ""},
  1420  		{"RDNSequence", Type, 0, ""},
  1421  		{"RelativeDistinguishedNameSET", Type, 0, ""},
  1422  		{"RevokedCertificate", Type, 0, ""},
  1423  		{"RevokedCertificate.Extensions", Field, 0, ""},
  1424  		{"RevokedCertificate.RevocationTime", Field, 0, ""},
  1425  		{"RevokedCertificate.SerialNumber", Field, 0, ""},
  1426  		{"TBSCertificateList", Type, 0, ""},
  1427  		{"TBSCertificateList.Extensions", Field, 0, ""},
  1428  		{"TBSCertificateList.Issuer", Field, 0, ""},
  1429  		{"TBSCertificateList.NextUpdate", Field, 0, ""},
  1430  		{"TBSCertificateList.Raw", Field, 0, ""},
  1431  		{"TBSCertificateList.RevokedCertificates", Field, 0, ""},
  1432  		{"TBSCertificateList.Signature", Field, 0, ""},
  1433  		{"TBSCertificateList.ThisUpdate", Field, 0, ""},
  1434  		{"TBSCertificateList.Version", Field, 0, ""},
  1435  	},
  1436  	"database/sql": {
  1437  		{"(*ColumnType).DatabaseTypeName", Method, 8, ""},
  1438  		{"(*ColumnType).DecimalSize", Method, 8, ""},
  1439  		{"(*ColumnType).Length", Method, 8, ""},
  1440  		{"(*ColumnType).Name", Method, 8, ""},
  1441  		{"(*ColumnType).Nullable", Method, 8, ""},
  1442  		{"(*ColumnType).ScanType", Method, 8, ""},
  1443  		{"(*Conn).BeginTx", Method, 9, ""},
  1444  		{"(*Conn).Close", Method, 9, ""},
  1445  		{"(*Conn).ExecContext", Method, 9, ""},
  1446  		{"(*Conn).PingContext", Method, 9, ""},
  1447  		{"(*Conn).PrepareContext", Method, 9, ""},
  1448  		{"(*Conn).QueryContext", Method, 9, ""},
  1449  		{"(*Conn).QueryRowContext", Method, 9, ""},
  1450  		{"(*Conn).Raw", Method, 13, ""},
  1451  		{"(*DB).Begin", Method, 0, ""},
  1452  		{"(*DB).BeginTx", Method, 8, ""},
  1453  		{"(*DB).Close", Method, 0, ""},
  1454  		{"(*DB).Conn", Method, 9, ""},
  1455  		{"(*DB).Driver", Method, 0, ""},
  1456  		{"(*DB).Exec", Method, 0, ""},
  1457  		{"(*DB).ExecContext", Method, 8, ""},
  1458  		{"(*DB).Ping", Method, 1, ""},
  1459  		{"(*DB).PingContext", Method, 8, ""},
  1460  		{"(*DB).Prepare", Method, 0, ""},
  1461  		{"(*DB).PrepareContext", Method, 8, ""},
  1462  		{"(*DB).Query", Method, 0, ""},
  1463  		{"(*DB).QueryContext", Method, 8, ""},
  1464  		{"(*DB).QueryRow", Method, 0, ""},
  1465  		{"(*DB).QueryRowContext", Method, 8, ""},
  1466  		{"(*DB).SetConnMaxIdleTime", Method, 15, ""},
  1467  		{"(*DB).SetConnMaxLifetime", Method, 6, ""},
  1468  		{"(*DB).SetMaxIdleConns", Method, 1, ""},
  1469  		{"(*DB).SetMaxOpenConns", Method, 2, ""},
  1470  		{"(*DB).Stats", Method, 5, ""},
  1471  		{"(*Null).Scan", Method, 22, ""},
  1472  		{"(*NullBool).Scan", Method, 0, ""},
  1473  		{"(*NullByte).Scan", Method, 17, ""},
  1474  		{"(*NullFloat64).Scan", Method, 0, ""},
  1475  		{"(*NullInt16).Scan", Method, 17, ""},
  1476  		{"(*NullInt32).Scan", Method, 13, ""},
  1477  		{"(*NullInt64).Scan", Method, 0, ""},
  1478  		{"(*NullString).Scan", Method, 0, ""},
  1479  		{"(*NullTime).Scan", Method, 13, ""},
  1480  		{"(*Row).Err", Method, 15, ""},
  1481  		{"(*Row).Scan", Method, 0, ""},
  1482  		{"(*Rows).Close", Method, 0, ""},
  1483  		{"(*Rows).ColumnTypes", Method, 8, ""},
  1484  		{"(*Rows).Columns", Method, 0, ""},
  1485  		{"(*Rows).Err", Method, 0, ""},
  1486  		{"(*Rows).Next", Method, 0, ""},
  1487  		{"(*Rows).NextResultSet", Method, 8, ""},
  1488  		{"(*Rows).Scan", Method, 0, ""},
  1489  		{"(*Stmt).Close", Method, 0, ""},
  1490  		{"(*Stmt).Exec", Method, 0, ""},
  1491  		{"(*Stmt).ExecContext", Method, 8, ""},
  1492  		{"(*Stmt).Query", Method, 0, ""},
  1493  		{"(*Stmt).QueryContext", Method, 8, ""},
  1494  		{"(*Stmt).QueryRow", Method, 0, ""},
  1495  		{"(*Stmt).QueryRowContext", Method, 8, ""},
  1496  		{"(*Tx).Commit", Method, 0, ""},
  1497  		{"(*Tx).Exec", Method, 0, ""},
  1498  		{"(*Tx).ExecContext", Method, 8, ""},
  1499  		{"(*Tx).Prepare", Method, 0, ""},
  1500  		{"(*Tx).PrepareContext", Method, 8, ""},
  1501  		{"(*Tx).Query", Method, 0, ""},
  1502  		{"(*Tx).QueryContext", Method, 8, ""},
  1503  		{"(*Tx).QueryRow", Method, 0, ""},
  1504  		{"(*Tx).QueryRowContext", Method, 8, ""},
  1505  		{"(*Tx).Rollback", Method, 0, ""},
  1506  		{"(*Tx).Stmt", Method, 0, ""},
  1507  		{"(*Tx).StmtContext", Method, 8, ""},
  1508  		{"(IsolationLevel).String", Method, 11, ""},
  1509  		{"(Null).Value", Method, 22, ""},
  1510  		{"(NullBool).Value", Method, 0, ""},
  1511  		{"(NullByte).Value", Method, 17, ""},
  1512  		{"(NullFloat64).Value", Method, 0, ""},
  1513  		{"(NullInt16).Value", Method, 17, ""},
  1514  		{"(NullInt32).Value", Method, 13, ""},
  1515  		{"(NullInt64).Value", Method, 0, ""},
  1516  		{"(NullString).Value", Method, 0, ""},
  1517  		{"(NullTime).Value", Method, 13, ""},
  1518  		{"ColumnType", Type, 8, ""},
  1519  		{"Conn", Type, 9, ""},
  1520  		{"DB", Type, 0, ""},
  1521  		{"DBStats", Type, 5, ""},
  1522  		{"DBStats.Idle", Field, 11, ""},
  1523  		{"DBStats.InUse", Field, 11, ""},
  1524  		{"DBStats.MaxIdleClosed", Field, 11, ""},
  1525  		{"DBStats.MaxIdleTimeClosed", Field, 15, ""},
  1526  		{"DBStats.MaxLifetimeClosed", Field, 11, ""},
  1527  		{"DBStats.MaxOpenConnections", Field, 11, ""},
  1528  		{"DBStats.OpenConnections", Field, 5, ""},
  1529  		{"DBStats.WaitCount", Field, 11, ""},
  1530  		{"DBStats.WaitDuration", Field, 11, ""},
  1531  		{"Drivers", Func, 4, "func() []string"},
  1532  		{"ErrConnDone", Var, 9, ""},
  1533  		{"ErrNoRows", Var, 0, ""},
  1534  		{"ErrTxDone", Var, 0, ""},
  1535  		{"IsolationLevel", Type, 8, ""},
  1536  		{"LevelDefault", Const, 8, ""},
  1537  		{"LevelLinearizable", Const, 8, ""},
  1538  		{"LevelReadCommitted", Const, 8, ""},
  1539  		{"LevelReadUncommitted", Const, 8, ""},
  1540  		{"LevelRepeatableRead", Const, 8, ""},
  1541  		{"LevelSerializable", Const, 8, ""},
  1542  		{"LevelSnapshot", Const, 8, ""},
  1543  		{"LevelWriteCommitted", Const, 8, ""},
  1544  		{"Named", Func, 8, "func(name string, value any) NamedArg"},
  1545  		{"NamedArg", Type, 8, ""},
  1546  		{"NamedArg.Name", Field, 8, ""},
  1547  		{"NamedArg.Value", Field, 8, ""},
  1548  		{"Null", Type, 22, ""},
  1549  		{"Null.V", Field, 22, ""},
  1550  		{"Null.Valid", Field, 22, ""},
  1551  		{"NullBool", Type, 0, ""},
  1552  		{"NullBool.Bool", Field, 0, ""},
  1553  		{"NullBool.Valid", Field, 0, ""},
  1554  		{"NullByte", Type, 17, ""},
  1555  		{"NullByte.Byte", Field, 17, ""},
  1556  		{"NullByte.Valid", Field, 17, ""},
  1557  		{"NullFloat64", Type, 0, ""},
  1558  		{"NullFloat64.Float64", Field, 0, ""},
  1559  		{"NullFloat64.Valid", Field, 0, ""},
  1560  		{"NullInt16", Type, 17, ""},
  1561  		{"NullInt16.Int16", Field, 17, ""},
  1562  		{"NullInt16.Valid", Field, 17, ""},
  1563  		{"NullInt32", Type, 13, ""},
  1564  		{"NullInt32.Int32", Field, 13, ""},
  1565  		{"NullInt32.Valid", Field, 13, ""},
  1566  		{"NullInt64", Type, 0, ""},
  1567  		{"NullInt64.Int64", Field, 0, ""},
  1568  		{"NullInt64.Valid", Field, 0, ""},
  1569  		{"NullString", Type, 0, ""},
  1570  		{"NullString.String", Field, 0, ""},
  1571  		{"NullString.Valid", Field, 0, ""},
  1572  		{"NullTime", Type, 13, ""},
  1573  		{"NullTime.Time", Field, 13, ""},
  1574  		{"NullTime.Valid", Field, 13, ""},
  1575  		{"Open", Func, 0, "func(driverName string, dataSourceName string) (*DB, error)"},
  1576  		{"OpenDB", Func, 10, "func(c driver.Connector) *DB"},
  1577  		{"Out", Type, 9, ""},
  1578  		{"Out.Dest", Field, 9, ""},
  1579  		{"Out.In", Field, 9, ""},
  1580  		{"RawBytes", Type, 0, ""},
  1581  		{"Register", Func, 0, "func(name string, driver driver.Driver)"},
  1582  		{"Result", Type, 0, ""},
  1583  		{"Row", Type, 0, ""},
  1584  		{"Rows", Type, 0, ""},
  1585  		{"Scanner", Type, 0, ""},
  1586  		{"Stmt", Type, 0, ""},
  1587  		{"Tx", Type, 0, ""},
  1588  		{"TxOptions", Type, 8, ""},
  1589  		{"TxOptions.Isolation", Field, 8, ""},
  1590  		{"TxOptions.ReadOnly", Field, 8, ""},
  1591  	},
  1592  	"database/sql/driver": {
  1593  		{"(NotNull).ConvertValue", Method, 0, ""},
  1594  		{"(Null).ConvertValue", Method, 0, ""},
  1595  		{"(RowsAffected).LastInsertId", Method, 0, ""},
  1596  		{"(RowsAffected).RowsAffected", Method, 0, ""},
  1597  		{"Bool", Var, 0, ""},
  1598  		{"ColumnConverter", Type, 0, ""},
  1599  		{"Conn", Type, 0, ""},
  1600  		{"ConnBeginTx", Type, 8, ""},
  1601  		{"ConnPrepareContext", Type, 8, ""},
  1602  		{"Connector", Type, 10, ""},
  1603  		{"DefaultParameterConverter", Var, 0, ""},
  1604  		{"Driver", Type, 0, ""},
  1605  		{"DriverContext", Type, 10, ""},
  1606  		{"ErrBadConn", Var, 0, ""},
  1607  		{"ErrRemoveArgument", Var, 9, ""},
  1608  		{"ErrSkip", Var, 0, ""},
  1609  		{"Execer", Type, 0, ""},
  1610  		{"ExecerContext", Type, 8, ""},
  1611  		{"Int32", Var, 0, ""},
  1612  		{"IsScanValue", Func, 0, "func(v any) bool"},
  1613  		{"IsValue", Func, 0, "func(v any) bool"},
  1614  		{"IsolationLevel", Type, 8, ""},
  1615  		{"NamedValue", Type, 8, ""},
  1616  		{"NamedValue.Name", Field, 8, ""},
  1617  		{"NamedValue.Ordinal", Field, 8, ""},
  1618  		{"NamedValue.Value", Field, 8, ""},
  1619  		{"NamedValueChecker", Type, 9, ""},
  1620  		{"NotNull", Type, 0, ""},
  1621  		{"NotNull.Converter", Field, 0, ""},
  1622  		{"Null", Type, 0, ""},
  1623  		{"Null.Converter", Field, 0, ""},
  1624  		{"Pinger", Type, 8, ""},
  1625  		{"Queryer", Type, 1, ""},
  1626  		{"QueryerContext", Type, 8, ""},
  1627  		{"Result", Type, 0, ""},
  1628  		{"ResultNoRows", Var, 0, ""},
  1629  		{"Rows", Type, 0, ""},
  1630  		{"RowsAffected", Type, 0, ""},
  1631  		{"RowsColumnTypeDatabaseTypeName", Type, 8, ""},
  1632  		{"RowsColumnTypeLength", Type, 8, ""},
  1633  		{"RowsColumnTypeNullable", Type, 8, ""},
  1634  		{"RowsColumnTypePrecisionScale", Type, 8, ""},
  1635  		{"RowsColumnTypeScanType", Type, 8, ""},
  1636  		{"RowsNextResultSet", Type, 8, ""},
  1637  		{"SessionResetter", Type, 10, ""},
  1638  		{"Stmt", Type, 0, ""},
  1639  		{"StmtExecContext", Type, 8, ""},
  1640  		{"StmtQueryContext", Type, 8, ""},
  1641  		{"String", Var, 0, ""},
  1642  		{"Tx", Type, 0, ""},
  1643  		{"TxOptions", Type, 8, ""},
  1644  		{"TxOptions.Isolation", Field, 8, ""},
  1645  		{"TxOptions.ReadOnly", Field, 8, ""},
  1646  		{"Validator", Type, 15, ""},
  1647  		{"Value", Type, 0, ""},
  1648  		{"ValueConverter", Type, 0, ""},
  1649  		{"Valuer", Type, 0, ""},
  1650  	},
  1651  	"debug/buildinfo": {
  1652  		{"BuildInfo", Type, 18, ""},
  1653  		{"Read", Func, 18, "func(r io.ReaderAt) (*BuildInfo, error)"},
  1654  		{"ReadFile", Func, 18, "func(name string) (info *BuildInfo, err error)"},
  1655  	},
  1656  	"debug/dwarf": {
  1657  		{"(*AddrType).Basic", Method, 0, ""},
  1658  		{"(*AddrType).Common", Method, 0, ""},
  1659  		{"(*AddrType).Size", Method, 0, ""},
  1660  		{"(*AddrType).String", Method, 0, ""},
  1661  		{"(*ArrayType).Common", Method, 0, ""},
  1662  		{"(*ArrayType).Size", Method, 0, ""},
  1663  		{"(*ArrayType).String", Method, 0, ""},
  1664  		{"(*BasicType).Basic", Method, 0, ""},
  1665  		{"(*BasicType).Common", Method, 0, ""},
  1666  		{"(*BasicType).Size", Method, 0, ""},
  1667  		{"(*BasicType).String", Method, 0, ""},
  1668  		{"(*BoolType).Basic", Method, 0, ""},
  1669  		{"(*BoolType).Common", Method, 0, ""},
  1670  		{"(*BoolType).Size", Method, 0, ""},
  1671  		{"(*BoolType).String", Method, 0, ""},
  1672  		{"(*CharType).Basic", Method, 0, ""},
  1673  		{"(*CharType).Common", Method, 0, ""},
  1674  		{"(*CharType).Size", Method, 0, ""},
  1675  		{"(*CharType).String", Method, 0, ""},
  1676  		{"(*CommonType).Common", Method, 0, ""},
  1677  		{"(*CommonType).Size", Method, 0, ""},
  1678  		{"(*ComplexType).Basic", Method, 0, ""},
  1679  		{"(*ComplexType).Common", Method, 0, ""},
  1680  		{"(*ComplexType).Size", Method, 0, ""},
  1681  		{"(*ComplexType).String", Method, 0, ""},
  1682  		{"(*Data).AddSection", Method, 14, ""},
  1683  		{"(*Data).AddTypes", Method, 3, ""},
  1684  		{"(*Data).LineReader", Method, 5, ""},
  1685  		{"(*Data).Ranges", Method, 7, ""},
  1686  		{"(*Data).Reader", Method, 0, ""},
  1687  		{"(*Data).Type", Method, 0, ""},
  1688  		{"(*DotDotDotType).Common", Method, 0, ""},
  1689  		{"(*DotDotDotType).Size", Method, 0, ""},
  1690  		{"(*DotDotDotType).String", Method, 0, ""},
  1691  		{"(*Entry).AttrField", Method, 5, ""},
  1692  		{"(*Entry).Val", Method, 0, ""},
  1693  		{"(*EnumType).Common", Method, 0, ""},
  1694  		{"(*EnumType).Size", Method, 0, ""},
  1695  		{"(*EnumType).String", Method, 0, ""},
  1696  		{"(*FloatType).Basic", Method, 0, ""},
  1697  		{"(*FloatType).Common", Method, 0, ""},
  1698  		{"(*FloatType).Size", Method, 0, ""},
  1699  		{"(*FloatType).String", Method, 0, ""},
  1700  		{"(*FuncType).Common", Method, 0, ""},
  1701  		{"(*FuncType).Size", Method, 0, ""},
  1702  		{"(*FuncType).String", Method, 0, ""},
  1703  		{"(*IntType).Basic", Method, 0, ""},
  1704  		{"(*IntType).Common", Method, 0, ""},
  1705  		{"(*IntType).Size", Method, 0, ""},
  1706  		{"(*IntType).String", Method, 0, ""},
  1707  		{"(*LineReader).Files", Method, 14, ""},
  1708  		{"(*LineReader).Next", Method, 5, ""},
  1709  		{"(*LineReader).Reset", Method, 5, ""},
  1710  		{"(*LineReader).Seek", Method, 5, ""},
  1711  		{"(*LineReader).SeekPC", Method, 5, ""},
  1712  		{"(*LineReader).Tell", Method, 5, ""},
  1713  		{"(*PtrType).Common", Method, 0, ""},
  1714  		{"(*PtrType).Size", Method, 0, ""},
  1715  		{"(*PtrType).String", Method, 0, ""},
  1716  		{"(*QualType).Common", Method, 0, ""},
  1717  		{"(*QualType).Size", Method, 0, ""},
  1718  		{"(*QualType).String", Method, 0, ""},
  1719  		{"(*Reader).AddressSize", Method, 5, ""},
  1720  		{"(*Reader).ByteOrder", Method, 14, ""},
  1721  		{"(*Reader).Next", Method, 0, ""},
  1722  		{"(*Reader).Seek", Method, 0, ""},
  1723  		{"(*Reader).SeekPC", Method, 7, ""},
  1724  		{"(*Reader).SkipChildren", Method, 0, ""},
  1725  		{"(*StructType).Common", Method, 0, ""},
  1726  		{"(*StructType).Defn", Method, 0, ""},
  1727  		{"(*StructType).Size", Method, 0, ""},
  1728  		{"(*StructType).String", Method, 0, ""},
  1729  		{"(*TypedefType).Common", Method, 0, ""},
  1730  		{"(*TypedefType).Size", Method, 0, ""},
  1731  		{"(*TypedefType).String", Method, 0, ""},
  1732  		{"(*UcharType).Basic", Method, 0, ""},
  1733  		{"(*UcharType).Common", Method, 0, ""},
  1734  		{"(*UcharType).Size", Method, 0, ""},
  1735  		{"(*UcharType).String", Method, 0, ""},
  1736  		{"(*UintType).Basic", Method, 0, ""},
  1737  		{"(*UintType).Common", Method, 0, ""},
  1738  		{"(*UintType).Size", Method, 0, ""},
  1739  		{"(*UintType).String", Method, 0, ""},
  1740  		{"(*UnspecifiedType).Basic", Method, 4, ""},
  1741  		{"(*UnspecifiedType).Common", Method, 4, ""},
  1742  		{"(*UnspecifiedType).Size", Method, 4, ""},
  1743  		{"(*UnspecifiedType).String", Method, 4, ""},
  1744  		{"(*UnsupportedType).Common", Method, 13, ""},
  1745  		{"(*UnsupportedType).Size", Method, 13, ""},
  1746  		{"(*UnsupportedType).String", Method, 13, ""},
  1747  		{"(*VoidType).Common", Method, 0, ""},
  1748  		{"(*VoidType).Size", Method, 0, ""},
  1749  		{"(*VoidType).String", Method, 0, ""},
  1750  		{"(Attr).GoString", Method, 0, ""},
  1751  		{"(Attr).String", Method, 0, ""},
  1752  		{"(Class).GoString", Method, 5, ""},
  1753  		{"(Class).String", Method, 5, ""},
  1754  		{"(DecodeError).Error", Method, 0, ""},
  1755  		{"(Tag).GoString", Method, 0, ""},
  1756  		{"(Tag).String", Method, 0, ""},
  1757  		{"AddrType", Type, 0, ""},
  1758  		{"AddrType.BasicType", Field, 0, ""},
  1759  		{"ArrayType", Type, 0, ""},
  1760  		{"ArrayType.CommonType", Field, 0, ""},
  1761  		{"ArrayType.Count", Field, 0, ""},
  1762  		{"ArrayType.StrideBitSize", Field, 0, ""},
  1763  		{"ArrayType.Type", Field, 0, ""},
  1764  		{"Attr", Type, 0, ""},
  1765  		{"AttrAbstractOrigin", Const, 0, ""},
  1766  		{"AttrAccessibility", Const, 0, ""},
  1767  		{"AttrAddrBase", Const, 14, ""},
  1768  		{"AttrAddrClass", Const, 0, ""},
  1769  		{"AttrAlignment", Const, 14, ""},
  1770  		{"AttrAllocated", Const, 0, ""},
  1771  		{"AttrArtificial", Const, 0, ""},
  1772  		{"AttrAssociated", Const, 0, ""},
  1773  		{"AttrBaseTypes", Const, 0, ""},
  1774  		{"AttrBinaryScale", Const, 14, ""},
  1775  		{"AttrBitOffset", Const, 0, ""},
  1776  		{"AttrBitSize", Const, 0, ""},
  1777  		{"AttrByteSize", Const, 0, ""},
  1778  		{"AttrCallAllCalls", Const, 14, ""},
  1779  		{"AttrCallAllSourceCalls", Const, 14, ""},
  1780  		{"AttrCallAllTailCalls", Const, 14, ""},
  1781  		{"AttrCallColumn", Const, 0, ""},
  1782  		{"AttrCallDataLocation", Const, 14, ""},
  1783  		{"AttrCallDataValue", Const, 14, ""},
  1784  		{"AttrCallFile", Const, 0, ""},
  1785  		{"AttrCallLine", Const, 0, ""},
  1786  		{"AttrCallOrigin", Const, 14, ""},
  1787  		{"AttrCallPC", Const, 14, ""},
  1788  		{"AttrCallParameter", Const, 14, ""},
  1789  		{"AttrCallReturnPC", Const, 14, ""},
  1790  		{"AttrCallTailCall", Const, 14, ""},
  1791  		{"AttrCallTarget", Const, 14, ""},
  1792  		{"AttrCallTargetClobbered", Const, 14, ""},
  1793  		{"AttrCallValue", Const, 14, ""},
  1794  		{"AttrCalling", Const, 0, ""},
  1795  		{"AttrCommonRef", Const, 0, ""},
  1796  		{"AttrCompDir", Const, 0, ""},
  1797  		{"AttrConstExpr", Const, 14, ""},
  1798  		{"AttrConstValue", Const, 0, ""},
  1799  		{"AttrContainingType", Const, 0, ""},
  1800  		{"AttrCount", Const, 0, ""},
  1801  		{"AttrDataBitOffset", Const, 14, ""},
  1802  		{"AttrDataLocation", Const, 0, ""},
  1803  		{"AttrDataMemberLoc", Const, 0, ""},
  1804  		{"AttrDecimalScale", Const, 14, ""},
  1805  		{"AttrDecimalSign", Const, 14, ""},
  1806  		{"AttrDeclColumn", Const, 0, ""},
  1807  		{"AttrDeclFile", Const, 0, ""},
  1808  		{"AttrDeclLine", Const, 0, ""},
  1809  		{"AttrDeclaration", Const, 0, ""},
  1810  		{"AttrDefaultValue", Const, 0, ""},
  1811  		{"AttrDefaulted", Const, 14, ""},
  1812  		{"AttrDeleted", Const, 14, ""},
  1813  		{"AttrDescription", Const, 0, ""},
  1814  		{"AttrDigitCount", Const, 14, ""},
  1815  		{"AttrDiscr", Const, 0, ""},
  1816  		{"AttrDiscrList", Const, 0, ""},
  1817  		{"AttrDiscrValue", Const, 0, ""},
  1818  		{"AttrDwoName", Const, 14, ""},
  1819  		{"AttrElemental", Const, 14, ""},
  1820  		{"AttrEncoding", Const, 0, ""},
  1821  		{"AttrEndianity", Const, 14, ""},
  1822  		{"AttrEntrypc", Const, 0, ""},
  1823  		{"AttrEnumClass", Const, 14, ""},
  1824  		{"AttrExplicit", Const, 14, ""},
  1825  		{"AttrExportSymbols", Const, 14, ""},
  1826  		{"AttrExtension", Const, 0, ""},
  1827  		{"AttrExternal", Const, 0, ""},
  1828  		{"AttrFrameBase", Const, 0, ""},
  1829  		{"AttrFriend", Const, 0, ""},
  1830  		{"AttrHighpc", Const, 0, ""},
  1831  		{"AttrIdentifierCase", Const, 0, ""},
  1832  		{"AttrImport", Const, 0, ""},
  1833  		{"AttrInline", Const, 0, ""},
  1834  		{"AttrIsOptional", Const, 0, ""},
  1835  		{"AttrLanguage", Const, 0, ""},
  1836  		{"AttrLinkageName", Const, 14, ""},
  1837  		{"AttrLocation", Const, 0, ""},
  1838  		{"AttrLoclistsBase", Const, 14, ""},
  1839  		{"AttrLowerBound", Const, 0, ""},
  1840  		{"AttrLowpc", Const, 0, ""},
  1841  		{"AttrMacroInfo", Const, 0, ""},
  1842  		{"AttrMacros", Const, 14, ""},
  1843  		{"AttrMainSubprogram", Const, 14, ""},
  1844  		{"AttrMutable", Const, 14, ""},
  1845  		{"AttrName", Const, 0, ""},
  1846  		{"AttrNamelistItem", Const, 0, ""},
  1847  		{"AttrNoreturn", Const, 14, ""},
  1848  		{"AttrObjectPointer", Const, 14, ""},
  1849  		{"AttrOrdering", Const, 0, ""},
  1850  		{"AttrPictureString", Const, 14, ""},
  1851  		{"AttrPriority", Const, 0, ""},
  1852  		{"AttrProducer", Const, 0, ""},
  1853  		{"AttrPrototyped", Const, 0, ""},
  1854  		{"AttrPure", Const, 14, ""},
  1855  		{"AttrRanges", Const, 0, ""},
  1856  		{"AttrRank", Const, 14, ""},
  1857  		{"AttrRecursive", Const, 14, ""},
  1858  		{"AttrReference", Const, 14, ""},
  1859  		{"AttrReturnAddr", Const, 0, ""},
  1860  		{"AttrRnglistsBase", Const, 14, ""},
  1861  		{"AttrRvalueReference", Const, 14, ""},
  1862  		{"AttrSegment", Const, 0, ""},
  1863  		{"AttrSibling", Const, 0, ""},
  1864  		{"AttrSignature", Const, 14, ""},
  1865  		{"AttrSmall", Const, 14, ""},
  1866  		{"AttrSpecification", Const, 0, ""},
  1867  		{"AttrStartScope", Const, 0, ""},
  1868  		{"AttrStaticLink", Const, 0, ""},
  1869  		{"AttrStmtList", Const, 0, ""},
  1870  		{"AttrStrOffsetsBase", Const, 14, ""},
  1871  		{"AttrStride", Const, 0, ""},
  1872  		{"AttrStrideSize", Const, 0, ""},
  1873  		{"AttrStringLength", Const, 0, ""},
  1874  		{"AttrStringLengthBitSize", Const, 14, ""},
  1875  		{"AttrStringLengthByteSize", Const, 14, ""},
  1876  		{"AttrThreadsScaled", Const, 14, ""},
  1877  		{"AttrTrampoline", Const, 0, ""},
  1878  		{"AttrType", Const, 0, ""},
  1879  		{"AttrUpperBound", Const, 0, ""},
  1880  		{"AttrUseLocation", Const, 0, ""},
  1881  		{"AttrUseUTF8", Const, 0, ""},
  1882  		{"AttrVarParam", Const, 0, ""},
  1883  		{"AttrVirtuality", Const, 0, ""},
  1884  		{"AttrVisibility", Const, 0, ""},
  1885  		{"AttrVtableElemLoc", Const, 0, ""},
  1886  		{"BasicType", Type, 0, ""},
  1887  		{"BasicType.BitOffset", Field, 0, ""},
  1888  		{"BasicType.BitSize", Field, 0, ""},
  1889  		{"BasicType.CommonType", Field, 0, ""},
  1890  		{"BasicType.DataBitOffset", Field, 18, ""},
  1891  		{"BoolType", Type, 0, ""},
  1892  		{"BoolType.BasicType", Field, 0, ""},
  1893  		{"CharType", Type, 0, ""},
  1894  		{"CharType.BasicType", Field, 0, ""},
  1895  		{"Class", Type, 5, ""},
  1896  		{"ClassAddrPtr", Const, 14, ""},
  1897  		{"ClassAddress", Const, 5, ""},
  1898  		{"ClassBlock", Const, 5, ""},
  1899  		{"ClassConstant", Const, 5, ""},
  1900  		{"ClassExprLoc", Const, 5, ""},
  1901  		{"ClassFlag", Const, 5, ""},
  1902  		{"ClassLinePtr", Const, 5, ""},
  1903  		{"ClassLocList", Const, 14, ""},
  1904  		{"ClassLocListPtr", Const, 5, ""},
  1905  		{"ClassMacPtr", Const, 5, ""},
  1906  		{"ClassRangeListPtr", Const, 5, ""},
  1907  		{"ClassReference", Const, 5, ""},
  1908  		{"ClassReferenceAlt", Const, 5, ""},
  1909  		{"ClassReferenceSig", Const, 5, ""},
  1910  		{"ClassRngList", Const, 14, ""},
  1911  		{"ClassRngListsPtr", Const, 14, ""},
  1912  		{"ClassStrOffsetsPtr", Const, 14, ""},
  1913  		{"ClassString", Const, 5, ""},
  1914  		{"ClassStringAlt", Const, 5, ""},
  1915  		{"ClassUnknown", Const, 6, ""},
  1916  		{"CommonType", Type, 0, ""},
  1917  		{"CommonType.ByteSize", Field, 0, ""},
  1918  		{"CommonType.Name", Field, 0, ""},
  1919  		{"ComplexType", Type, 0, ""},
  1920  		{"ComplexType.BasicType", Field, 0, ""},
  1921  		{"Data", Type, 0, ""},
  1922  		{"DecodeError", Type, 0, ""},
  1923  		{"DecodeError.Err", Field, 0, ""},
  1924  		{"DecodeError.Name", Field, 0, ""},
  1925  		{"DecodeError.Offset", Field, 0, ""},
  1926  		{"DotDotDotType", Type, 0, ""},
  1927  		{"DotDotDotType.CommonType", Field, 0, ""},
  1928  		{"Entry", Type, 0, ""},
  1929  		{"Entry.Children", Field, 0, ""},
  1930  		{"Entry.Field", Field, 0, ""},
  1931  		{"Entry.Offset", Field, 0, ""},
  1932  		{"Entry.Tag", Field, 0, ""},
  1933  		{"EnumType", Type, 0, ""},
  1934  		{"EnumType.CommonType", Field, 0, ""},
  1935  		{"EnumType.EnumName", Field, 0, ""},
  1936  		{"EnumType.Val", Field, 0, ""},
  1937  		{"EnumValue", Type, 0, ""},
  1938  		{"EnumValue.Name", Field, 0, ""},
  1939  		{"EnumValue.Val", Field, 0, ""},
  1940  		{"ErrUnknownPC", Var, 5, ""},
  1941  		{"Field", Type, 0, ""},
  1942  		{"Field.Attr", Field, 0, ""},
  1943  		{"Field.Class", Field, 5, ""},
  1944  		{"Field.Val", Field, 0, ""},
  1945  		{"FloatType", Type, 0, ""},
  1946  		{"FloatType.BasicType", Field, 0, ""},
  1947  		{"FuncType", Type, 0, ""},
  1948  		{"FuncType.CommonType", Field, 0, ""},
  1949  		{"FuncType.ParamType", Field, 0, ""},
  1950  		{"FuncType.ReturnType", Field, 0, ""},
  1951  		{"IntType", Type, 0, ""},
  1952  		{"IntType.BasicType", Field, 0, ""},
  1953  		{"LineEntry", Type, 5, ""},
  1954  		{"LineEntry.Address", Field, 5, ""},
  1955  		{"LineEntry.BasicBlock", Field, 5, ""},
  1956  		{"LineEntry.Column", Field, 5, ""},
  1957  		{"LineEntry.Discriminator", Field, 5, ""},
  1958  		{"LineEntry.EndSequence", Field, 5, ""},
  1959  		{"LineEntry.EpilogueBegin", Field, 5, ""},
  1960  		{"LineEntry.File", Field, 5, ""},
  1961  		{"LineEntry.ISA", Field, 5, ""},
  1962  		{"LineEntry.IsStmt", Field, 5, ""},
  1963  		{"LineEntry.Line", Field, 5, ""},
  1964  		{"LineEntry.OpIndex", Field, 5, ""},
  1965  		{"LineEntry.PrologueEnd", Field, 5, ""},
  1966  		{"LineFile", Type, 5, ""},
  1967  		{"LineFile.Length", Field, 5, ""},
  1968  		{"LineFile.Mtime", Field, 5, ""},
  1969  		{"LineFile.Name", Field, 5, ""},
  1970  		{"LineReader", Type, 5, ""},
  1971  		{"LineReaderPos", Type, 5, ""},
  1972  		{"New", Func, 0, "func(abbrev []byte, aranges []byte, frame []byte, info []byte, line []byte, pubnames []byte, ranges []byte, str []byte) (*Data, error)"},
  1973  		{"Offset", Type, 0, ""},
  1974  		{"PtrType", Type, 0, ""},
  1975  		{"PtrType.CommonType", Field, 0, ""},
  1976  		{"PtrType.Type", Field, 0, ""},
  1977  		{"QualType", Type, 0, ""},
  1978  		{"QualType.CommonType", Field, 0, ""},
  1979  		{"QualType.Qual", Field, 0, ""},
  1980  		{"QualType.Type", Field, 0, ""},
  1981  		{"Reader", Type, 0, ""},
  1982  		{"StructField", Type, 0, ""},
  1983  		{"StructField.BitOffset", Field, 0, ""},
  1984  		{"StructField.BitSize", Field, 0, ""},
  1985  		{"StructField.ByteOffset", Field, 0, ""},
  1986  		{"StructField.ByteSize", Field, 0, ""},
  1987  		{"StructField.DataBitOffset", Field, 18, ""},
  1988  		{"StructField.Name", Field, 0, ""},
  1989  		{"StructField.Type", Field, 0, ""},
  1990  		{"StructType", Type, 0, ""},
  1991  		{"StructType.CommonType", Field, 0, ""},
  1992  		{"StructType.Field", Field, 0, ""},
  1993  		{"StructType.Incomplete", Field, 0, ""},
  1994  		{"StructType.Kind", Field, 0, ""},
  1995  		{"StructType.StructName", Field, 0, ""},
  1996  		{"Tag", Type, 0, ""},
  1997  		{"TagAccessDeclaration", Const, 0, ""},
  1998  		{"TagArrayType", Const, 0, ""},
  1999  		{"TagAtomicType", Const, 14, ""},
  2000  		{"TagBaseType", Const, 0, ""},
  2001  		{"TagCallSite", Const, 14, ""},
  2002  		{"TagCallSiteParameter", Const, 14, ""},
  2003  		{"TagCatchDwarfBlock", Const, 0, ""},
  2004  		{"TagClassType", Const, 0, ""},
  2005  		{"TagCoarrayType", Const, 14, ""},
  2006  		{"TagCommonDwarfBlock", Const, 0, ""},
  2007  		{"TagCommonInclusion", Const, 0, ""},
  2008  		{"TagCompileUnit", Const, 0, ""},
  2009  		{"TagCondition", Const, 3, ""},
  2010  		{"TagConstType", Const, 0, ""},
  2011  		{"TagConstant", Const, 0, ""},
  2012  		{"TagDwarfProcedure", Const, 0, ""},
  2013  		{"TagDynamicType", Const, 14, ""},
  2014  		{"TagEntryPoint", Const, 0, ""},
  2015  		{"TagEnumerationType", Const, 0, ""},
  2016  		{"TagEnumerator", Const, 0, ""},
  2017  		{"TagFileType", Const, 0, ""},
  2018  		{"TagFormalParameter", Const, 0, ""},
  2019  		{"TagFriend", Const, 0, ""},
  2020  		{"TagGenericSubrange", Const, 14, ""},
  2021  		{"TagImmutableType", Const, 14, ""},
  2022  		{"TagImportedDeclaration", Const, 0, ""},
  2023  		{"TagImportedModule", Const, 0, ""},
  2024  		{"TagImportedUnit", Const, 0, ""},
  2025  		{"TagInheritance", Const, 0, ""},
  2026  		{"TagInlinedSubroutine", Const, 0, ""},
  2027  		{"TagInterfaceType", Const, 0, ""},
  2028  		{"TagLabel", Const, 0, ""},
  2029  		{"TagLexDwarfBlock", Const, 0, ""},
  2030  		{"TagMember", Const, 0, ""},
  2031  		{"TagModule", Const, 0, ""},
  2032  		{"TagMutableType", Const, 0, ""},
  2033  		{"TagNamelist", Const, 0, ""},
  2034  		{"TagNamelistItem", Const, 0, ""},
  2035  		{"TagNamespace", Const, 0, ""},
  2036  		{"TagPackedType", Const, 0, ""},
  2037  		{"TagPartialUnit", Const, 0, ""},
  2038  		{"TagPointerType", Const, 0, ""},
  2039  		{"TagPtrToMemberType", Const, 0, ""},
  2040  		{"TagReferenceType", Const, 0, ""},
  2041  		{"TagRestrictType", Const, 0, ""},
  2042  		{"TagRvalueReferenceType", Const, 3, ""},
  2043  		{"TagSetType", Const, 0, ""},
  2044  		{"TagSharedType", Const, 3, ""},
  2045  		{"TagSkeletonUnit", Const, 14, ""},
  2046  		{"TagStringType", Const, 0, ""},
  2047  		{"TagStructType", Const, 0, ""},
  2048  		{"TagSubprogram", Const, 0, ""},
  2049  		{"TagSubrangeType", Const, 0, ""},
  2050  		{"TagSubroutineType", Const, 0, ""},
  2051  		{"TagTemplateAlias", Const, 3, ""},
  2052  		{"TagTemplateTypeParameter", Const, 0, ""},
  2053  		{"TagTemplateValueParameter", Const, 0, ""},
  2054  		{"TagThrownType", Const, 0, ""},
  2055  		{"TagTryDwarfBlock", Const, 0, ""},
  2056  		{"TagTypeUnit", Const, 3, ""},
  2057  		{"TagTypedef", Const, 0, ""},
  2058  		{"TagUnionType", Const, 0, ""},
  2059  		{"TagUnspecifiedParameters", Const, 0, ""},
  2060  		{"TagUnspecifiedType", Const, 0, ""},
  2061  		{"TagVariable", Const, 0, ""},
  2062  		{"TagVariant", Const, 0, ""},
  2063  		{"TagVariantPart", Const, 0, ""},
  2064  		{"TagVolatileType", Const, 0, ""},
  2065  		{"TagWithStmt", Const, 0, ""},
  2066  		{"Type", Type, 0, ""},
  2067  		{"TypedefType", Type, 0, ""},
  2068  		{"TypedefType.CommonType", Field, 0, ""},
  2069  		{"TypedefType.Type", Field, 0, ""},
  2070  		{"UcharType", Type, 0, ""},
  2071  		{"UcharType.BasicType", Field, 0, ""},
  2072  		{"UintType", Type, 0, ""},
  2073  		{"UintType.BasicType", Field, 0, ""},
  2074  		{"UnspecifiedType", Type, 4, ""},
  2075  		{"UnspecifiedType.BasicType", Field, 4, ""},
  2076  		{"UnsupportedType", Type, 13, ""},
  2077  		{"UnsupportedType.CommonType", Field, 13, ""},
  2078  		{"UnsupportedType.Tag", Field, 13, ""},
  2079  		{"VoidType", Type, 0, ""},
  2080  		{"VoidType.CommonType", Field, 0, ""},
  2081  	},
  2082  	"debug/elf": {
  2083  		{"(*File).Close", Method, 0, ""},
  2084  		{"(*File).DWARF", Method, 0, ""},
  2085  		{"(*File).DynString", Method, 1, ""},
  2086  		{"(*File).DynValue", Method, 21, ""},
  2087  		{"(*File).DynamicSymbols", Method, 4, ""},
  2088  		{"(*File).DynamicVersionNeeds", Method, 24, ""},
  2089  		{"(*File).DynamicVersions", Method, 24, ""},
  2090  		{"(*File).ImportedLibraries", Method, 0, ""},
  2091  		{"(*File).ImportedSymbols", Method, 0, ""},
  2092  		{"(*File).Section", Method, 0, ""},
  2093  		{"(*File).SectionByType", Method, 0, ""},
  2094  		{"(*File).Symbols", Method, 0, ""},
  2095  		{"(*FormatError).Error", Method, 0, ""},
  2096  		{"(*Prog).Open", Method, 0, ""},
  2097  		{"(*Section).Data", Method, 0, ""},
  2098  		{"(*Section).Open", Method, 0, ""},
  2099  		{"(Class).GoString", Method, 0, ""},
  2100  		{"(Class).String", Method, 0, ""},
  2101  		{"(CompressionType).GoString", Method, 6, ""},
  2102  		{"(CompressionType).String", Method, 6, ""},
  2103  		{"(Data).GoString", Method, 0, ""},
  2104  		{"(Data).String", Method, 0, ""},
  2105  		{"(DynFlag).GoString", Method, 0, ""},
  2106  		{"(DynFlag).String", Method, 0, ""},
  2107  		{"(DynFlag1).GoString", Method, 21, ""},
  2108  		{"(DynFlag1).String", Method, 21, ""},
  2109  		{"(DynTag).GoString", Method, 0, ""},
  2110  		{"(DynTag).String", Method, 0, ""},
  2111  		{"(Machine).GoString", Method, 0, ""},
  2112  		{"(Machine).String", Method, 0, ""},
  2113  		{"(NType).GoString", Method, 0, ""},
  2114  		{"(NType).String", Method, 0, ""},
  2115  		{"(OSABI).GoString", Method, 0, ""},
  2116  		{"(OSABI).String", Method, 0, ""},
  2117  		{"(Prog).ReadAt", Method, 0, ""},
  2118  		{"(ProgFlag).GoString", Method, 0, ""},
  2119  		{"(ProgFlag).String", Method, 0, ""},
  2120  		{"(ProgType).GoString", Method, 0, ""},
  2121  		{"(ProgType).String", Method, 0, ""},
  2122  		{"(R_386).GoString", Method, 0, ""},
  2123  		{"(R_386).String", Method, 0, ""},
  2124  		{"(R_390).GoString", Method, 7, ""},
  2125  		{"(R_390).String", Method, 7, ""},
  2126  		{"(R_AARCH64).GoString", Method, 4, ""},
  2127  		{"(R_AARCH64).String", Method, 4, ""},
  2128  		{"(R_ALPHA).GoString", Method, 0, ""},
  2129  		{"(R_ALPHA).String", Method, 0, ""},
  2130  		{"(R_ARM).GoString", Method, 0, ""},
  2131  		{"(R_ARM).String", Method, 0, ""},
  2132  		{"(R_LARCH).GoString", Method, 19, ""},
  2133  		{"(R_LARCH).String", Method, 19, ""},
  2134  		{"(R_MIPS).GoString", Method, 6, ""},
  2135  		{"(R_MIPS).String", Method, 6, ""},
  2136  		{"(R_PPC).GoString", Method, 0, ""},
  2137  		{"(R_PPC).String", Method, 0, ""},
  2138  		{"(R_PPC64).GoString", Method, 5, ""},
  2139  		{"(R_PPC64).String", Method, 5, ""},
  2140  		{"(R_RISCV).GoString", Method, 11, ""},
  2141  		{"(R_RISCV).String", Method, 11, ""},
  2142  		{"(R_SPARC).GoString", Method, 0, ""},
  2143  		{"(R_SPARC).String", Method, 0, ""},
  2144  		{"(R_X86_64).GoString", Method, 0, ""},
  2145  		{"(R_X86_64).String", Method, 0, ""},
  2146  		{"(Section).ReadAt", Method, 0, ""},
  2147  		{"(SectionFlag).GoString", Method, 0, ""},
  2148  		{"(SectionFlag).String", Method, 0, ""},
  2149  		{"(SectionIndex).GoString", Method, 0, ""},
  2150  		{"(SectionIndex).String", Method, 0, ""},
  2151  		{"(SectionType).GoString", Method, 0, ""},
  2152  		{"(SectionType).String", Method, 0, ""},
  2153  		{"(SymBind).GoString", Method, 0, ""},
  2154  		{"(SymBind).String", Method, 0, ""},
  2155  		{"(SymType).GoString", Method, 0, ""},
  2156  		{"(SymType).String", Method, 0, ""},
  2157  		{"(SymVis).GoString", Method, 0, ""},
  2158  		{"(SymVis).String", Method, 0, ""},
  2159  		{"(Type).GoString", Method, 0, ""},
  2160  		{"(Type).String", Method, 0, ""},
  2161  		{"(Version).GoString", Method, 0, ""},
  2162  		{"(Version).String", Method, 0, ""},
  2163  		{"(VersionIndex).Index", Method, 24, ""},
  2164  		{"(VersionIndex).IsHidden", Method, 24, ""},
  2165  		{"ARM_MAGIC_TRAMP_NUMBER", Const, 0, ""},
  2166  		{"COMPRESS_HIOS", Const, 6, ""},
  2167  		{"COMPRESS_HIPROC", Const, 6, ""},
  2168  		{"COMPRESS_LOOS", Const, 6, ""},
  2169  		{"COMPRESS_LOPROC", Const, 6, ""},
  2170  		{"COMPRESS_ZLIB", Const, 6, ""},
  2171  		{"COMPRESS_ZSTD", Const, 21, ""},
  2172  		{"Chdr32", Type, 6, ""},
  2173  		{"Chdr32.Addralign", Field, 6, ""},
  2174  		{"Chdr32.Size", Field, 6, ""},
  2175  		{"Chdr32.Type", Field, 6, ""},
  2176  		{"Chdr64", Type, 6, ""},
  2177  		{"Chdr64.Addralign", Field, 6, ""},
  2178  		{"Chdr64.Size", Field, 6, ""},
  2179  		{"Chdr64.Type", Field, 6, ""},
  2180  		{"Class", Type, 0, ""},
  2181  		{"CompressionType", Type, 6, ""},
  2182  		{"DF_1_CONFALT", Const, 21, ""},
  2183  		{"DF_1_DIRECT", Const, 21, ""},
  2184  		{"DF_1_DISPRELDNE", Const, 21, ""},
  2185  		{"DF_1_DISPRELPND", Const, 21, ""},
  2186  		{"DF_1_EDITED", Const, 21, ""},
  2187  		{"DF_1_ENDFILTEE", Const, 21, ""},
  2188  		{"DF_1_GLOBAL", Const, 21, ""},
  2189  		{"DF_1_GLOBAUDIT", Const, 21, ""},
  2190  		{"DF_1_GROUP", Const, 21, ""},
  2191  		{"DF_1_IGNMULDEF", Const, 21, ""},
  2192  		{"DF_1_INITFIRST", Const, 21, ""},
  2193  		{"DF_1_INTERPOSE", Const, 21, ""},
  2194  		{"DF_1_KMOD", Const, 21, ""},
  2195  		{"DF_1_LOADFLTR", Const, 21, ""},
  2196  		{"DF_1_NOCOMMON", Const, 21, ""},
  2197  		{"DF_1_NODEFLIB", Const, 21, ""},
  2198  		{"DF_1_NODELETE", Const, 21, ""},
  2199  		{"DF_1_NODIRECT", Const, 21, ""},
  2200  		{"DF_1_NODUMP", Const, 21, ""},
  2201  		{"DF_1_NOHDR", Const, 21, ""},
  2202  		{"DF_1_NOKSYMS", Const, 21, ""},
  2203  		{"DF_1_NOOPEN", Const, 21, ""},
  2204  		{"DF_1_NORELOC", Const, 21, ""},
  2205  		{"DF_1_NOW", Const, 21, ""},
  2206  		{"DF_1_ORIGIN", Const, 21, ""},
  2207  		{"DF_1_PIE", Const, 21, ""},
  2208  		{"DF_1_SINGLETON", Const, 21, ""},
  2209  		{"DF_1_STUB", Const, 21, ""},
  2210  		{"DF_1_SYMINTPOSE", Const, 21, ""},
  2211  		{"DF_1_TRANS", Const, 21, ""},
  2212  		{"DF_1_WEAKFILTER", Const, 21, ""},
  2213  		{"DF_BIND_NOW", Const, 0, ""},
  2214  		{"DF_ORIGIN", Const, 0, ""},
  2215  		{"DF_STATIC_TLS", Const, 0, ""},
  2216  		{"DF_SYMBOLIC", Const, 0, ""},
  2217  		{"DF_TEXTREL", Const, 0, ""},
  2218  		{"DT_ADDRRNGHI", Const, 16, ""},
  2219  		{"DT_ADDRRNGLO", Const, 16, ""},
  2220  		{"DT_AUDIT", Const, 16, ""},
  2221  		{"DT_AUXILIARY", Const, 16, ""},
  2222  		{"DT_BIND_NOW", Const, 0, ""},
  2223  		{"DT_CHECKSUM", Const, 16, ""},
  2224  		{"DT_CONFIG", Const, 16, ""},
  2225  		{"DT_DEBUG", Const, 0, ""},
  2226  		{"DT_DEPAUDIT", Const, 16, ""},
  2227  		{"DT_ENCODING", Const, 0, ""},
  2228  		{"DT_FEATURE", Const, 16, ""},
  2229  		{"DT_FILTER", Const, 16, ""},
  2230  		{"DT_FINI", Const, 0, ""},
  2231  		{"DT_FINI_ARRAY", Const, 0, ""},
  2232  		{"DT_FINI_ARRAYSZ", Const, 0, ""},
  2233  		{"DT_FLAGS", Const, 0, ""},
  2234  		{"DT_FLAGS_1", Const, 16, ""},
  2235  		{"DT_GNU_CONFLICT", Const, 16, ""},
  2236  		{"DT_GNU_CONFLICTSZ", Const, 16, ""},
  2237  		{"DT_GNU_HASH", Const, 16, ""},
  2238  		{"DT_GNU_LIBLIST", Const, 16, ""},
  2239  		{"DT_GNU_LIBLISTSZ", Const, 16, ""},
  2240  		{"DT_GNU_PRELINKED", Const, 16, ""},
  2241  		{"DT_HASH", Const, 0, ""},
  2242  		{"DT_HIOS", Const, 0, ""},
  2243  		{"DT_HIPROC", Const, 0, ""},
  2244  		{"DT_INIT", Const, 0, ""},
  2245  		{"DT_INIT_ARRAY", Const, 0, ""},
  2246  		{"DT_INIT_ARRAYSZ", Const, 0, ""},
  2247  		{"DT_JMPREL", Const, 0, ""},
  2248  		{"DT_LOOS", Const, 0, ""},
  2249  		{"DT_LOPROC", Const, 0, ""},
  2250  		{"DT_MIPS_AUX_DYNAMIC", Const, 16, ""},
  2251  		{"DT_MIPS_BASE_ADDRESS", Const, 16, ""},
  2252  		{"DT_MIPS_COMPACT_SIZE", Const, 16, ""},
  2253  		{"DT_MIPS_CONFLICT", Const, 16, ""},
  2254  		{"DT_MIPS_CONFLICTNO", Const, 16, ""},
  2255  		{"DT_MIPS_CXX_FLAGS", Const, 16, ""},
  2256  		{"DT_MIPS_DELTA_CLASS", Const, 16, ""},
  2257  		{"DT_MIPS_DELTA_CLASSSYM", Const, 16, ""},
  2258  		{"DT_MIPS_DELTA_CLASSSYM_NO", Const, 16, ""},
  2259  		{"DT_MIPS_DELTA_CLASS_NO", Const, 16, ""},
  2260  		{"DT_MIPS_DELTA_INSTANCE", Const, 16, ""},
  2261  		{"DT_MIPS_DELTA_INSTANCE_NO", Const, 16, ""},
  2262  		{"DT_MIPS_DELTA_RELOC", Const, 16, ""},
  2263  		{"DT_MIPS_DELTA_RELOC_NO", Const, 16, ""},
  2264  		{"DT_MIPS_DELTA_SYM", Const, 16, ""},
  2265  		{"DT_MIPS_DELTA_SYM_NO", Const, 16, ""},
  2266  		{"DT_MIPS_DYNSTR_ALIGN", Const, 16, ""},
  2267  		{"DT_MIPS_FLAGS", Const, 16, ""},
  2268  		{"DT_MIPS_GOTSYM", Const, 16, ""},
  2269  		{"DT_MIPS_GP_VALUE", Const, 16, ""},
  2270  		{"DT_MIPS_HIDDEN_GOTIDX", Const, 16, ""},
  2271  		{"DT_MIPS_HIPAGENO", Const, 16, ""},
  2272  		{"DT_MIPS_ICHECKSUM", Const, 16, ""},
  2273  		{"DT_MIPS_INTERFACE", Const, 16, ""},
  2274  		{"DT_MIPS_INTERFACE_SIZE", Const, 16, ""},
  2275  		{"DT_MIPS_IVERSION", Const, 16, ""},
  2276  		{"DT_MIPS_LIBLIST", Const, 16, ""},
  2277  		{"DT_MIPS_LIBLISTNO", Const, 16, ""},
  2278  		{"DT_MIPS_LOCALPAGE_GOTIDX", Const, 16, ""},
  2279  		{"DT_MIPS_LOCAL_GOTIDX", Const, 16, ""},
  2280  		{"DT_MIPS_LOCAL_GOTNO", Const, 16, ""},
  2281  		{"DT_MIPS_MSYM", Const, 16, ""},
  2282  		{"DT_MIPS_OPTIONS", Const, 16, ""},
  2283  		{"DT_MIPS_PERF_SUFFIX", Const, 16, ""},
  2284  		{"DT_MIPS_PIXIE_INIT", Const, 16, ""},
  2285  		{"DT_MIPS_PLTGOT", Const, 16, ""},
  2286  		{"DT_MIPS_PROTECTED_GOTIDX", Const, 16, ""},
  2287  		{"DT_MIPS_RLD_MAP", Const, 16, ""},
  2288  		{"DT_MIPS_RLD_MAP_REL", Const, 16, ""},
  2289  		{"DT_MIPS_RLD_TEXT_RESOLVE_ADDR", Const, 16, ""},
  2290  		{"DT_MIPS_RLD_VERSION", Const, 16, ""},
  2291  		{"DT_MIPS_RWPLT", Const, 16, ""},
  2292  		{"DT_MIPS_SYMBOL_LIB", Const, 16, ""},
  2293  		{"DT_MIPS_SYMTABNO", Const, 16, ""},
  2294  		{"DT_MIPS_TIME_STAMP", Const, 16, ""},
  2295  		{"DT_MIPS_UNREFEXTNO", Const, 16, ""},
  2296  		{"DT_MOVEENT", Const, 16, ""},
  2297  		{"DT_MOVESZ", Const, 16, ""},
  2298  		{"DT_MOVETAB", Const, 16, ""},
  2299  		{"DT_NEEDED", Const, 0, ""},
  2300  		{"DT_NULL", Const, 0, ""},
  2301  		{"DT_PLTGOT", Const, 0, ""},
  2302  		{"DT_PLTPAD", Const, 16, ""},
  2303  		{"DT_PLTPADSZ", Const, 16, ""},
  2304  		{"DT_PLTREL", Const, 0, ""},
  2305  		{"DT_PLTRELSZ", Const, 0, ""},
  2306  		{"DT_POSFLAG_1", Const, 16, ""},
  2307  		{"DT_PPC64_GLINK", Const, 16, ""},
  2308  		{"DT_PPC64_OPD", Const, 16, ""},
  2309  		{"DT_PPC64_OPDSZ", Const, 16, ""},
  2310  		{"DT_PPC64_OPT", Const, 16, ""},
  2311  		{"DT_PPC_GOT", Const, 16, ""},
  2312  		{"DT_PPC_OPT", Const, 16, ""},
  2313  		{"DT_PREINIT_ARRAY", Const, 0, ""},
  2314  		{"DT_PREINIT_ARRAYSZ", Const, 0, ""},
  2315  		{"DT_REL", Const, 0, ""},
  2316  		{"DT_RELA", Const, 0, ""},
  2317  		{"DT_RELACOUNT", Const, 16, ""},
  2318  		{"DT_RELAENT", Const, 0, ""},
  2319  		{"DT_RELASZ", Const, 0, ""},
  2320  		{"DT_RELCOUNT", Const, 16, ""},
  2321  		{"DT_RELENT", Const, 0, ""},
  2322  		{"DT_RELSZ", Const, 0, ""},
  2323  		{"DT_RPATH", Const, 0, ""},
  2324  		{"DT_RUNPATH", Const, 0, ""},
  2325  		{"DT_SONAME", Const, 0, ""},
  2326  		{"DT_SPARC_REGISTER", Const, 16, ""},
  2327  		{"DT_STRSZ", Const, 0, ""},
  2328  		{"DT_STRTAB", Const, 0, ""},
  2329  		{"DT_SYMBOLIC", Const, 0, ""},
  2330  		{"DT_SYMENT", Const, 0, ""},
  2331  		{"DT_SYMINENT", Const, 16, ""},
  2332  		{"DT_SYMINFO", Const, 16, ""},
  2333  		{"DT_SYMINSZ", Const, 16, ""},
  2334  		{"DT_SYMTAB", Const, 0, ""},
  2335  		{"DT_SYMTAB_SHNDX", Const, 16, ""},
  2336  		{"DT_TEXTREL", Const, 0, ""},
  2337  		{"DT_TLSDESC_GOT", Const, 16, ""},
  2338  		{"DT_TLSDESC_PLT", Const, 16, ""},
  2339  		{"DT_USED", Const, 16, ""},
  2340  		{"DT_VALRNGHI", Const, 16, ""},
  2341  		{"DT_VALRNGLO", Const, 16, ""},
  2342  		{"DT_VERDEF", Const, 16, ""},
  2343  		{"DT_VERDEFNUM", Const, 16, ""},
  2344  		{"DT_VERNEED", Const, 0, ""},
  2345  		{"DT_VERNEEDNUM", Const, 0, ""},
  2346  		{"DT_VERSYM", Const, 0, ""},
  2347  		{"Data", Type, 0, ""},
  2348  		{"Dyn32", Type, 0, ""},
  2349  		{"Dyn32.Tag", Field, 0, ""},
  2350  		{"Dyn32.Val", Field, 0, ""},
  2351  		{"Dyn64", Type, 0, ""},
  2352  		{"Dyn64.Tag", Field, 0, ""},
  2353  		{"Dyn64.Val", Field, 0, ""},
  2354  		{"DynFlag", Type, 0, ""},
  2355  		{"DynFlag1", Type, 21, ""},
  2356  		{"DynTag", Type, 0, ""},
  2357  		{"DynamicVersion", Type, 24, ""},
  2358  		{"DynamicVersion.Deps", Field, 24, ""},
  2359  		{"DynamicVersion.Flags", Field, 24, ""},
  2360  		{"DynamicVersion.Index", Field, 24, ""},
  2361  		{"DynamicVersion.Name", Field, 24, ""},
  2362  		{"DynamicVersionDep", Type, 24, ""},
  2363  		{"DynamicVersionDep.Dep", Field, 24, ""},
  2364  		{"DynamicVersionDep.Flags", Field, 24, ""},
  2365  		{"DynamicVersionDep.Index", Field, 24, ""},
  2366  		{"DynamicVersionFlag", Type, 24, ""},
  2367  		{"DynamicVersionNeed", Type, 24, ""},
  2368  		{"DynamicVersionNeed.Name", Field, 24, ""},
  2369  		{"DynamicVersionNeed.Needs", Field, 24, ""},
  2370  		{"EI_ABIVERSION", Const, 0, ""},
  2371  		{"EI_CLASS", Const, 0, ""},
  2372  		{"EI_DATA", Const, 0, ""},
  2373  		{"EI_NIDENT", Const, 0, ""},
  2374  		{"EI_OSABI", Const, 0, ""},
  2375  		{"EI_PAD", Const, 0, ""},
  2376  		{"EI_VERSION", Const, 0, ""},
  2377  		{"ELFCLASS32", Const, 0, ""},
  2378  		{"ELFCLASS64", Const, 0, ""},
  2379  		{"ELFCLASSNONE", Const, 0, ""},
  2380  		{"ELFDATA2LSB", Const, 0, ""},
  2381  		{"ELFDATA2MSB", Const, 0, ""},
  2382  		{"ELFDATANONE", Const, 0, ""},
  2383  		{"ELFMAG", Const, 0, ""},
  2384  		{"ELFOSABI_86OPEN", Const, 0, ""},
  2385  		{"ELFOSABI_AIX", Const, 0, ""},
  2386  		{"ELFOSABI_ARM", Const, 0, ""},
  2387  		{"ELFOSABI_AROS", Const, 11, ""},
  2388  		{"ELFOSABI_CLOUDABI", Const, 11, ""},
  2389  		{"ELFOSABI_FENIXOS", Const, 11, ""},
  2390  		{"ELFOSABI_FREEBSD", Const, 0, ""},
  2391  		{"ELFOSABI_HPUX", Const, 0, ""},
  2392  		{"ELFOSABI_HURD", Const, 0, ""},
  2393  		{"ELFOSABI_IRIX", Const, 0, ""},
  2394  		{"ELFOSABI_LINUX", Const, 0, ""},
  2395  		{"ELFOSABI_MODESTO", Const, 0, ""},
  2396  		{"ELFOSABI_NETBSD", Const, 0, ""},
  2397  		{"ELFOSABI_NONE", Const, 0, ""},
  2398  		{"ELFOSABI_NSK", Const, 0, ""},
  2399  		{"ELFOSABI_OPENBSD", Const, 0, ""},
  2400  		{"ELFOSABI_OPENVMS", Const, 0, ""},
  2401  		{"ELFOSABI_SOLARIS", Const, 0, ""},
  2402  		{"ELFOSABI_STANDALONE", Const, 0, ""},
  2403  		{"ELFOSABI_TRU64", Const, 0, ""},
  2404  		{"EM_386", Const, 0, ""},
  2405  		{"EM_486", Const, 0, ""},
  2406  		{"EM_56800EX", Const, 11, ""},
  2407  		{"EM_68HC05", Const, 11, ""},
  2408  		{"EM_68HC08", Const, 11, ""},
  2409  		{"EM_68HC11", Const, 11, ""},
  2410  		{"EM_68HC12", Const, 0, ""},
  2411  		{"EM_68HC16", Const, 11, ""},
  2412  		{"EM_68K", Const, 0, ""},
  2413  		{"EM_78KOR", Const, 11, ""},
  2414  		{"EM_8051", Const, 11, ""},
  2415  		{"EM_860", Const, 0, ""},
  2416  		{"EM_88K", Const, 0, ""},
  2417  		{"EM_960", Const, 0, ""},
  2418  		{"EM_AARCH64", Const, 4, ""},
  2419  		{"EM_ALPHA", Const, 0, ""},
  2420  		{"EM_ALPHA_STD", Const, 0, ""},
  2421  		{"EM_ALTERA_NIOS2", Const, 11, ""},
  2422  		{"EM_AMDGPU", Const, 11, ""},
  2423  		{"EM_ARC", Const, 0, ""},
  2424  		{"EM_ARCA", Const, 11, ""},
  2425  		{"EM_ARC_COMPACT", Const, 11, ""},
  2426  		{"EM_ARC_COMPACT2", Const, 11, ""},
  2427  		{"EM_ARM", Const, 0, ""},
  2428  		{"EM_AVR", Const, 11, ""},
  2429  		{"EM_AVR32", Const, 11, ""},
  2430  		{"EM_BA1", Const, 11, ""},
  2431  		{"EM_BA2", Const, 11, ""},
  2432  		{"EM_BLACKFIN", Const, 11, ""},
  2433  		{"EM_BPF", Const, 11, ""},
  2434  		{"EM_C166", Const, 11, ""},
  2435  		{"EM_CDP", Const, 11, ""},
  2436  		{"EM_CE", Const, 11, ""},
  2437  		{"EM_CLOUDSHIELD", Const, 11, ""},
  2438  		{"EM_COGE", Const, 11, ""},
  2439  		{"EM_COLDFIRE", Const, 0, ""},
  2440  		{"EM_COOL", Const, 11, ""},
  2441  		{"EM_COREA_1ST", Const, 11, ""},
  2442  		{"EM_COREA_2ND", Const, 11, ""},
  2443  		{"EM_CR", Const, 11, ""},
  2444  		{"EM_CR16", Const, 11, ""},
  2445  		{"EM_CRAYNV2", Const, 11, ""},
  2446  		{"EM_CRIS", Const, 11, ""},
  2447  		{"EM_CRX", Const, 11, ""},
  2448  		{"EM_CSR_KALIMBA", Const, 11, ""},
  2449  		{"EM_CUDA", Const, 11, ""},
  2450  		{"EM_CYPRESS_M8C", Const, 11, ""},
  2451  		{"EM_D10V", Const, 11, ""},
  2452  		{"EM_D30V", Const, 11, ""},
  2453  		{"EM_DSP24", Const, 11, ""},
  2454  		{"EM_DSPIC30F", Const, 11, ""},
  2455  		{"EM_DXP", Const, 11, ""},
  2456  		{"EM_ECOG1", Const, 11, ""},
  2457  		{"EM_ECOG16", Const, 11, ""},
  2458  		{"EM_ECOG1X", Const, 11, ""},
  2459  		{"EM_ECOG2", Const, 11, ""},
  2460  		{"EM_ETPU", Const, 11, ""},
  2461  		{"EM_EXCESS", Const, 11, ""},
  2462  		{"EM_F2MC16", Const, 11, ""},
  2463  		{"EM_FIREPATH", Const, 11, ""},
  2464  		{"EM_FR20", Const, 0, ""},
  2465  		{"EM_FR30", Const, 11, ""},
  2466  		{"EM_FT32", Const, 11, ""},
  2467  		{"EM_FX66", Const, 11, ""},
  2468  		{"EM_H8S", Const, 0, ""},
  2469  		{"EM_H8_300", Const, 0, ""},
  2470  		{"EM_H8_300H", Const, 0, ""},
  2471  		{"EM_H8_500", Const, 0, ""},
  2472  		{"EM_HUANY", Const, 11, ""},
  2473  		{"EM_IA_64", Const, 0, ""},
  2474  		{"EM_INTEL205", Const, 11, ""},
  2475  		{"EM_INTEL206", Const, 11, ""},
  2476  		{"EM_INTEL207", Const, 11, ""},
  2477  		{"EM_INTEL208", Const, 11, ""},
  2478  		{"EM_INTEL209", Const, 11, ""},
  2479  		{"EM_IP2K", Const, 11, ""},
  2480  		{"EM_JAVELIN", Const, 11, ""},
  2481  		{"EM_K10M", Const, 11, ""},
  2482  		{"EM_KM32", Const, 11, ""},
  2483  		{"EM_KMX16", Const, 11, ""},
  2484  		{"EM_KMX32", Const, 11, ""},
  2485  		{"EM_KMX8", Const, 11, ""},
  2486  		{"EM_KVARC", Const, 11, ""},
  2487  		{"EM_L10M", Const, 11, ""},
  2488  		{"EM_LANAI", Const, 11, ""},
  2489  		{"EM_LATTICEMICO32", Const, 11, ""},
  2490  		{"EM_LOONGARCH", Const, 19, ""},
  2491  		{"EM_M16C", Const, 11, ""},
  2492  		{"EM_M32", Const, 0, ""},
  2493  		{"EM_M32C", Const, 11, ""},
  2494  		{"EM_M32R", Const, 11, ""},
  2495  		{"EM_MANIK", Const, 11, ""},
  2496  		{"EM_MAX", Const, 11, ""},
  2497  		{"EM_MAXQ30", Const, 11, ""},
  2498  		{"EM_MCHP_PIC", Const, 11, ""},
  2499  		{"EM_MCST_ELBRUS", Const, 11, ""},
  2500  		{"EM_ME16", Const, 0, ""},
  2501  		{"EM_METAG", Const, 11, ""},
  2502  		{"EM_MICROBLAZE", Const, 11, ""},
  2503  		{"EM_MIPS", Const, 0, ""},
  2504  		{"EM_MIPS_RS3_LE", Const, 0, ""},
  2505  		{"EM_MIPS_RS4_BE", Const, 0, ""},
  2506  		{"EM_MIPS_X", Const, 0, ""},
  2507  		{"EM_MMA", Const, 0, ""},
  2508  		{"EM_MMDSP_PLUS", Const, 11, ""},
  2509  		{"EM_MMIX", Const, 11, ""},
  2510  		{"EM_MN10200", Const, 11, ""},
  2511  		{"EM_MN10300", Const, 11, ""},
  2512  		{"EM_MOXIE", Const, 11, ""},
  2513  		{"EM_MSP430", Const, 11, ""},
  2514  		{"EM_NCPU", Const, 0, ""},
  2515  		{"EM_NDR1", Const, 0, ""},
  2516  		{"EM_NDS32", Const, 11, ""},
  2517  		{"EM_NONE", Const, 0, ""},
  2518  		{"EM_NORC", Const, 11, ""},
  2519  		{"EM_NS32K", Const, 11, ""},
  2520  		{"EM_OPEN8", Const, 11, ""},
  2521  		{"EM_OPENRISC", Const, 11, ""},
  2522  		{"EM_PARISC", Const, 0, ""},
  2523  		{"EM_PCP", Const, 0, ""},
  2524  		{"EM_PDP10", Const, 11, ""},
  2525  		{"EM_PDP11", Const, 11, ""},
  2526  		{"EM_PDSP", Const, 11, ""},
  2527  		{"EM_PJ", Const, 11, ""},
  2528  		{"EM_PPC", Const, 0, ""},
  2529  		{"EM_PPC64", Const, 0, ""},
  2530  		{"EM_PRISM", Const, 11, ""},
  2531  		{"EM_QDSP6", Const, 11, ""},
  2532  		{"EM_R32C", Const, 11, ""},
  2533  		{"EM_RCE", Const, 0, ""},
  2534  		{"EM_RH32", Const, 0, ""},
  2535  		{"EM_RISCV", Const, 11, ""},
  2536  		{"EM_RL78", Const, 11, ""},
  2537  		{"EM_RS08", Const, 11, ""},
  2538  		{"EM_RX", Const, 11, ""},
  2539  		{"EM_S370", Const, 0, ""},
  2540  		{"EM_S390", Const, 0, ""},
  2541  		{"EM_SCORE7", Const, 11, ""},
  2542  		{"EM_SEP", Const, 11, ""},
  2543  		{"EM_SE_C17", Const, 11, ""},
  2544  		{"EM_SE_C33", Const, 11, ""},
  2545  		{"EM_SH", Const, 0, ""},
  2546  		{"EM_SHARC", Const, 11, ""},
  2547  		{"EM_SLE9X", Const, 11, ""},
  2548  		{"EM_SNP1K", Const, 11, ""},
  2549  		{"EM_SPARC", Const, 0, ""},
  2550  		{"EM_SPARC32PLUS", Const, 0, ""},
  2551  		{"EM_SPARCV9", Const, 0, ""},
  2552  		{"EM_ST100", Const, 0, ""},
  2553  		{"EM_ST19", Const, 11, ""},
  2554  		{"EM_ST200", Const, 11, ""},
  2555  		{"EM_ST7", Const, 11, ""},
  2556  		{"EM_ST9PLUS", Const, 11, ""},
  2557  		{"EM_STARCORE", Const, 0, ""},
  2558  		{"EM_STM8", Const, 11, ""},
  2559  		{"EM_STXP7X", Const, 11, ""},
  2560  		{"EM_SVX", Const, 11, ""},
  2561  		{"EM_TILE64", Const, 11, ""},
  2562  		{"EM_TILEGX", Const, 11, ""},
  2563  		{"EM_TILEPRO", Const, 11, ""},
  2564  		{"EM_TINYJ", Const, 0, ""},
  2565  		{"EM_TI_ARP32", Const, 11, ""},
  2566  		{"EM_TI_C2000", Const, 11, ""},
  2567  		{"EM_TI_C5500", Const, 11, ""},
  2568  		{"EM_TI_C6000", Const, 11, ""},
  2569  		{"EM_TI_PRU", Const, 11, ""},
  2570  		{"EM_TMM_GPP", Const, 11, ""},
  2571  		{"EM_TPC", Const, 11, ""},
  2572  		{"EM_TRICORE", Const, 0, ""},
  2573  		{"EM_TRIMEDIA", Const, 11, ""},
  2574  		{"EM_TSK3000", Const, 11, ""},
  2575  		{"EM_UNICORE", Const, 11, ""},
  2576  		{"EM_V800", Const, 0, ""},
  2577  		{"EM_V850", Const, 11, ""},
  2578  		{"EM_VAX", Const, 11, ""},
  2579  		{"EM_VIDEOCORE", Const, 11, ""},
  2580  		{"EM_VIDEOCORE3", Const, 11, ""},
  2581  		{"EM_VIDEOCORE5", Const, 11, ""},
  2582  		{"EM_VISIUM", Const, 11, ""},
  2583  		{"EM_VPP500", Const, 0, ""},
  2584  		{"EM_X86_64", Const, 0, ""},
  2585  		{"EM_XCORE", Const, 11, ""},
  2586  		{"EM_XGATE", Const, 11, ""},
  2587  		{"EM_XIMO16", Const, 11, ""},
  2588  		{"EM_XTENSA", Const, 11, ""},
  2589  		{"EM_Z80", Const, 11, ""},
  2590  		{"EM_ZSP", Const, 11, ""},
  2591  		{"ET_CORE", Const, 0, ""},
  2592  		{"ET_DYN", Const, 0, ""},
  2593  		{"ET_EXEC", Const, 0, ""},
  2594  		{"ET_HIOS", Const, 0, ""},
  2595  		{"ET_HIPROC", Const, 0, ""},
  2596  		{"ET_LOOS", Const, 0, ""},
  2597  		{"ET_LOPROC", Const, 0, ""},
  2598  		{"ET_NONE", Const, 0, ""},
  2599  		{"ET_REL", Const, 0, ""},
  2600  		{"EV_CURRENT", Const, 0, ""},
  2601  		{"EV_NONE", Const, 0, ""},
  2602  		{"ErrNoSymbols", Var, 4, ""},
  2603  		{"File", Type, 0, ""},
  2604  		{"File.FileHeader", Field, 0, ""},
  2605  		{"File.Progs", Field, 0, ""},
  2606  		{"File.Sections", Field, 0, ""},
  2607  		{"FileHeader", Type, 0, ""},
  2608  		{"FileHeader.ABIVersion", Field, 0, ""},
  2609  		{"FileHeader.ByteOrder", Field, 0, ""},
  2610  		{"FileHeader.Class", Field, 0, ""},
  2611  		{"FileHeader.Data", Field, 0, ""},
  2612  		{"FileHeader.Entry", Field, 1, ""},
  2613  		{"FileHeader.Machine", Field, 0, ""},
  2614  		{"FileHeader.OSABI", Field, 0, ""},
  2615  		{"FileHeader.Type", Field, 0, ""},
  2616  		{"FileHeader.Version", Field, 0, ""},
  2617  		{"FormatError", Type, 0, ""},
  2618  		{"Header32", Type, 0, ""},
  2619  		{"Header32.Ehsize", Field, 0, ""},
  2620  		{"Header32.Entry", Field, 0, ""},
  2621  		{"Header32.Flags", Field, 0, ""},
  2622  		{"Header32.Ident", Field, 0, ""},
  2623  		{"Header32.Machine", Field, 0, ""},
  2624  		{"Header32.Phentsize", Field, 0, ""},
  2625  		{"Header32.Phnum", Field, 0, ""},
  2626  		{"Header32.Phoff", Field, 0, ""},
  2627  		{"Header32.Shentsize", Field, 0, ""},
  2628  		{"Header32.Shnum", Field, 0, ""},
  2629  		{"Header32.Shoff", Field, 0, ""},
  2630  		{"Header32.Shstrndx", Field, 0, ""},
  2631  		{"Header32.Type", Field, 0, ""},
  2632  		{"Header32.Version", Field, 0, ""},
  2633  		{"Header64", Type, 0, ""},
  2634  		{"Header64.Ehsize", Field, 0, ""},
  2635  		{"Header64.Entry", Field, 0, ""},
  2636  		{"Header64.Flags", Field, 0, ""},
  2637  		{"Header64.Ident", Field, 0, ""},
  2638  		{"Header64.Machine", Field, 0, ""},
  2639  		{"Header64.Phentsize", Field, 0, ""},
  2640  		{"Header64.Phnum", Field, 0, ""},
  2641  		{"Header64.Phoff", Field, 0, ""},
  2642  		{"Header64.Shentsize", Field, 0, ""},
  2643  		{"Header64.Shnum", Field, 0, ""},
  2644  		{"Header64.Shoff", Field, 0, ""},
  2645  		{"Header64.Shstrndx", Field, 0, ""},
  2646  		{"Header64.Type", Field, 0, ""},
  2647  		{"Header64.Version", Field, 0, ""},
  2648  		{"ImportedSymbol", Type, 0, ""},
  2649  		{"ImportedSymbol.Library", Field, 0, ""},
  2650  		{"ImportedSymbol.Name", Field, 0, ""},
  2651  		{"ImportedSymbol.Version", Field, 0, ""},
  2652  		{"Machine", Type, 0, ""},
  2653  		{"NT_FPREGSET", Const, 0, ""},
  2654  		{"NT_PRPSINFO", Const, 0, ""},
  2655  		{"NT_PRSTATUS", Const, 0, ""},
  2656  		{"NType", Type, 0, ""},
  2657  		{"NewFile", Func, 0, "func(r io.ReaderAt) (*File, error)"},
  2658  		{"OSABI", Type, 0, ""},
  2659  		{"Open", Func, 0, "func(name string) (*File, error)"},
  2660  		{"PF_MASKOS", Const, 0, ""},
  2661  		{"PF_MASKPROC", Const, 0, ""},
  2662  		{"PF_R", Const, 0, ""},
  2663  		{"PF_W", Const, 0, ""},
  2664  		{"PF_X", Const, 0, ""},
  2665  		{"PT_AARCH64_ARCHEXT", Const, 16, ""},
  2666  		{"PT_AARCH64_UNWIND", Const, 16, ""},
  2667  		{"PT_ARM_ARCHEXT", Const, 16, ""},
  2668  		{"PT_ARM_EXIDX", Const, 16, ""},
  2669  		{"PT_DYNAMIC", Const, 0, ""},
  2670  		{"PT_GNU_EH_FRAME", Const, 16, ""},
  2671  		{"PT_GNU_MBIND_HI", Const, 16, ""},
  2672  		{"PT_GNU_MBIND_LO", Const, 16, ""},
  2673  		{"PT_GNU_PROPERTY", Const, 16, ""},
  2674  		{"PT_GNU_RELRO", Const, 16, ""},
  2675  		{"PT_GNU_STACK", Const, 16, ""},
  2676  		{"PT_HIOS", Const, 0, ""},
  2677  		{"PT_HIPROC", Const, 0, ""},
  2678  		{"PT_INTERP", Const, 0, ""},
  2679  		{"PT_LOAD", Const, 0, ""},
  2680  		{"PT_LOOS", Const, 0, ""},
  2681  		{"PT_LOPROC", Const, 0, ""},
  2682  		{"PT_MIPS_ABIFLAGS", Const, 16, ""},
  2683  		{"PT_MIPS_OPTIONS", Const, 16, ""},
  2684  		{"PT_MIPS_REGINFO", Const, 16, ""},
  2685  		{"PT_MIPS_RTPROC", Const, 16, ""},
  2686  		{"PT_NOTE", Const, 0, ""},
  2687  		{"PT_NULL", Const, 0, ""},
  2688  		{"PT_OPENBSD_BOOTDATA", Const, 16, ""},
  2689  		{"PT_OPENBSD_NOBTCFI", Const, 23, ""},
  2690  		{"PT_OPENBSD_RANDOMIZE", Const, 16, ""},
  2691  		{"PT_OPENBSD_WXNEEDED", Const, 16, ""},
  2692  		{"PT_PAX_FLAGS", Const, 16, ""},
  2693  		{"PT_PHDR", Const, 0, ""},
  2694  		{"PT_RISCV_ATTRIBUTES", Const, 25, ""},
  2695  		{"PT_S390_PGSTE", Const, 16, ""},
  2696  		{"PT_SHLIB", Const, 0, ""},
  2697  		{"PT_SUNWSTACK", Const, 16, ""},
  2698  		{"PT_SUNW_EH_FRAME", Const, 16, ""},
  2699  		{"PT_TLS", Const, 0, ""},
  2700  		{"Prog", Type, 0, ""},
  2701  		{"Prog.ProgHeader", Field, 0, ""},
  2702  		{"Prog.ReaderAt", Field, 0, ""},
  2703  		{"Prog32", Type, 0, ""},
  2704  		{"Prog32.Align", Field, 0, ""},
  2705  		{"Prog32.Filesz", Field, 0, ""},
  2706  		{"Prog32.Flags", Field, 0, ""},
  2707  		{"Prog32.Memsz", Field, 0, ""},
  2708  		{"Prog32.Off", Field, 0, ""},
  2709  		{"Prog32.Paddr", Field, 0, ""},
  2710  		{"Prog32.Type", Field, 0, ""},
  2711  		{"Prog32.Vaddr", Field, 0, ""},
  2712  		{"Prog64", Type, 0, ""},
  2713  		{"Prog64.Align", Field, 0, ""},
  2714  		{"Prog64.Filesz", Field, 0, ""},
  2715  		{"Prog64.Flags", Field, 0, ""},
  2716  		{"Prog64.Memsz", Field, 0, ""},
  2717  		{"Prog64.Off", Field, 0, ""},
  2718  		{"Prog64.Paddr", Field, 0, ""},
  2719  		{"Prog64.Type", Field, 0, ""},
  2720  		{"Prog64.Vaddr", Field, 0, ""},
  2721  		{"ProgFlag", Type, 0, ""},
  2722  		{"ProgHeader", Type, 0, ""},
  2723  		{"ProgHeader.Align", Field, 0, ""},
  2724  		{"ProgHeader.Filesz", Field, 0, ""},
  2725  		{"ProgHeader.Flags", Field, 0, ""},
  2726  		{"ProgHeader.Memsz", Field, 0, ""},
  2727  		{"ProgHeader.Off", Field, 0, ""},
  2728  		{"ProgHeader.Paddr", Field, 0, ""},
  2729  		{"ProgHeader.Type", Field, 0, ""},
  2730  		{"ProgHeader.Vaddr", Field, 0, ""},
  2731  		{"ProgType", Type, 0, ""},
  2732  		{"R_386", Type, 0, ""},
  2733  		{"R_386_16", Const, 10, ""},
  2734  		{"R_386_32", Const, 0, ""},
  2735  		{"R_386_32PLT", Const, 10, ""},
  2736  		{"R_386_8", Const, 10, ""},
  2737  		{"R_386_COPY", Const, 0, ""},
  2738  		{"R_386_GLOB_DAT", Const, 0, ""},
  2739  		{"R_386_GOT32", Const, 0, ""},
  2740  		{"R_386_GOT32X", Const, 10, ""},
  2741  		{"R_386_GOTOFF", Const, 0, ""},
  2742  		{"R_386_GOTPC", Const, 0, ""},
  2743  		{"R_386_IRELATIVE", Const, 10, ""},
  2744  		{"R_386_JMP_SLOT", Const, 0, ""},
  2745  		{"R_386_NONE", Const, 0, ""},
  2746  		{"R_386_PC16", Const, 10, ""},
  2747  		{"R_386_PC32", Const, 0, ""},
  2748  		{"R_386_PC8", Const, 10, ""},
  2749  		{"R_386_PLT32", Const, 0, ""},
  2750  		{"R_386_RELATIVE", Const, 0, ""},
  2751  		{"R_386_SIZE32", Const, 10, ""},
  2752  		{"R_386_TLS_DESC", Const, 10, ""},
  2753  		{"R_386_TLS_DESC_CALL", Const, 10, ""},
  2754  		{"R_386_TLS_DTPMOD32", Const, 0, ""},
  2755  		{"R_386_TLS_DTPOFF32", Const, 0, ""},
  2756  		{"R_386_TLS_GD", Const, 0, ""},
  2757  		{"R_386_TLS_GD_32", Const, 0, ""},
  2758  		{"R_386_TLS_GD_CALL", Const, 0, ""},
  2759  		{"R_386_TLS_GD_POP", Const, 0, ""},
  2760  		{"R_386_TLS_GD_PUSH", Const, 0, ""},
  2761  		{"R_386_TLS_GOTDESC", Const, 10, ""},
  2762  		{"R_386_TLS_GOTIE", Const, 0, ""},
  2763  		{"R_386_TLS_IE", Const, 0, ""},
  2764  		{"R_386_TLS_IE_32", Const, 0, ""},
  2765  		{"R_386_TLS_LDM", Const, 0, ""},
  2766  		{"R_386_TLS_LDM_32", Const, 0, ""},
  2767  		{"R_386_TLS_LDM_CALL", Const, 0, ""},
  2768  		{"R_386_TLS_LDM_POP", Const, 0, ""},
  2769  		{"R_386_TLS_LDM_PUSH", Const, 0, ""},
  2770  		{"R_386_TLS_LDO_32", Const, 0, ""},
  2771  		{"R_386_TLS_LE", Const, 0, ""},
  2772  		{"R_386_TLS_LE_32", Const, 0, ""},
  2773  		{"R_386_TLS_TPOFF", Const, 0, ""},
  2774  		{"R_386_TLS_TPOFF32", Const, 0, ""},
  2775  		{"R_390", Type, 7, ""},
  2776  		{"R_390_12", Const, 7, ""},
  2777  		{"R_390_16", Const, 7, ""},
  2778  		{"R_390_20", Const, 7, ""},
  2779  		{"R_390_32", Const, 7, ""},
  2780  		{"R_390_64", Const, 7, ""},
  2781  		{"R_390_8", Const, 7, ""},
  2782  		{"R_390_COPY", Const, 7, ""},
  2783  		{"R_390_GLOB_DAT", Const, 7, ""},
  2784  		{"R_390_GOT12", Const, 7, ""},
  2785  		{"R_390_GOT16", Const, 7, ""},
  2786  		{"R_390_GOT20", Const, 7, ""},
  2787  		{"R_390_GOT32", Const, 7, ""},
  2788  		{"R_390_GOT64", Const, 7, ""},
  2789  		{"R_390_GOTENT", Const, 7, ""},
  2790  		{"R_390_GOTOFF", Const, 7, ""},
  2791  		{"R_390_GOTOFF16", Const, 7, ""},
  2792  		{"R_390_GOTOFF64", Const, 7, ""},
  2793  		{"R_390_GOTPC", Const, 7, ""},
  2794  		{"R_390_GOTPCDBL", Const, 7, ""},
  2795  		{"R_390_GOTPLT12", Const, 7, ""},
  2796  		{"R_390_GOTPLT16", Const, 7, ""},
  2797  		{"R_390_GOTPLT20", Const, 7, ""},
  2798  		{"R_390_GOTPLT32", Const, 7, ""},
  2799  		{"R_390_GOTPLT64", Const, 7, ""},
  2800  		{"R_390_GOTPLTENT", Const, 7, ""},
  2801  		{"R_390_GOTPLTOFF16", Const, 7, ""},
  2802  		{"R_390_GOTPLTOFF32", Const, 7, ""},
  2803  		{"R_390_GOTPLTOFF64", Const, 7, ""},
  2804  		{"R_390_JMP_SLOT", Const, 7, ""},
  2805  		{"R_390_NONE", Const, 7, ""},
  2806  		{"R_390_PC16", Const, 7, ""},
  2807  		{"R_390_PC16DBL", Const, 7, ""},
  2808  		{"R_390_PC32", Const, 7, ""},
  2809  		{"R_390_PC32DBL", Const, 7, ""},
  2810  		{"R_390_PC64", Const, 7, ""},
  2811  		{"R_390_PLT16DBL", Const, 7, ""},
  2812  		{"R_390_PLT32", Const, 7, ""},
  2813  		{"R_390_PLT32DBL", Const, 7, ""},
  2814  		{"R_390_PLT64", Const, 7, ""},
  2815  		{"R_390_RELATIVE", Const, 7, ""},
  2816  		{"R_390_TLS_DTPMOD", Const, 7, ""},
  2817  		{"R_390_TLS_DTPOFF", Const, 7, ""},
  2818  		{"R_390_TLS_GD32", Const, 7, ""},
  2819  		{"R_390_TLS_GD64", Const, 7, ""},
  2820  		{"R_390_TLS_GDCALL", Const, 7, ""},
  2821  		{"R_390_TLS_GOTIE12", Const, 7, ""},
  2822  		{"R_390_TLS_GOTIE20", Const, 7, ""},
  2823  		{"R_390_TLS_GOTIE32", Const, 7, ""},
  2824  		{"R_390_TLS_GOTIE64", Const, 7, ""},
  2825  		{"R_390_TLS_IE32", Const, 7, ""},
  2826  		{"R_390_TLS_IE64", Const, 7, ""},
  2827  		{"R_390_TLS_IEENT", Const, 7, ""},
  2828  		{"R_390_TLS_LDCALL", Const, 7, ""},
  2829  		{"R_390_TLS_LDM32", Const, 7, ""},
  2830  		{"R_390_TLS_LDM64", Const, 7, ""},
  2831  		{"R_390_TLS_LDO32", Const, 7, ""},
  2832  		{"R_390_TLS_LDO64", Const, 7, ""},
  2833  		{"R_390_TLS_LE32", Const, 7, ""},
  2834  		{"R_390_TLS_LE64", Const, 7, ""},
  2835  		{"R_390_TLS_LOAD", Const, 7, ""},
  2836  		{"R_390_TLS_TPOFF", Const, 7, ""},
  2837  		{"R_AARCH64", Type, 4, ""},
  2838  		{"R_AARCH64_ABS16", Const, 4, ""},
  2839  		{"R_AARCH64_ABS32", Const, 4, ""},
  2840  		{"R_AARCH64_ABS64", Const, 4, ""},
  2841  		{"R_AARCH64_ADD_ABS_LO12_NC", Const, 4, ""},
  2842  		{"R_AARCH64_ADR_GOT_PAGE", Const, 4, ""},
  2843  		{"R_AARCH64_ADR_PREL_LO21", Const, 4, ""},
  2844  		{"R_AARCH64_ADR_PREL_PG_HI21", Const, 4, ""},
  2845  		{"R_AARCH64_ADR_PREL_PG_HI21_NC", Const, 4, ""},
  2846  		{"R_AARCH64_CALL26", Const, 4, ""},
  2847  		{"R_AARCH64_CONDBR19", Const, 4, ""},
  2848  		{"R_AARCH64_COPY", Const, 4, ""},
  2849  		{"R_AARCH64_GLOB_DAT", Const, 4, ""},
  2850  		{"R_AARCH64_GOT_LD_PREL19", Const, 4, ""},
  2851  		{"R_AARCH64_IRELATIVE", Const, 4, ""},
  2852  		{"R_AARCH64_JUMP26", Const, 4, ""},
  2853  		{"R_AARCH64_JUMP_SLOT", Const, 4, ""},
  2854  		{"R_AARCH64_LD64_GOTOFF_LO15", Const, 10, ""},
  2855  		{"R_AARCH64_LD64_GOTPAGE_LO15", Const, 10, ""},
  2856  		{"R_AARCH64_LD64_GOT_LO12_NC", Const, 4, ""},
  2857  		{"R_AARCH64_LDST128_ABS_LO12_NC", Const, 4, ""},
  2858  		{"R_AARCH64_LDST16_ABS_LO12_NC", Const, 4, ""},
  2859  		{"R_AARCH64_LDST32_ABS_LO12_NC", Const, 4, ""},
  2860  		{"R_AARCH64_LDST64_ABS_LO12_NC", Const, 4, ""},
  2861  		{"R_AARCH64_LDST8_ABS_LO12_NC", Const, 4, ""},
  2862  		{"R_AARCH64_LD_PREL_LO19", Const, 4, ""},
  2863  		{"R_AARCH64_MOVW_SABS_G0", Const, 4, ""},
  2864  		{"R_AARCH64_MOVW_SABS_G1", Const, 4, ""},
  2865  		{"R_AARCH64_MOVW_SABS_G2", Const, 4, ""},
  2866  		{"R_AARCH64_MOVW_UABS_G0", Const, 4, ""},
  2867  		{"R_AARCH64_MOVW_UABS_G0_NC", Const, 4, ""},
  2868  		{"R_AARCH64_MOVW_UABS_G1", Const, 4, ""},
  2869  		{"R_AARCH64_MOVW_UABS_G1_NC", Const, 4, ""},
  2870  		{"R_AARCH64_MOVW_UABS_G2", Const, 4, ""},
  2871  		{"R_AARCH64_MOVW_UABS_G2_NC", Const, 4, ""},
  2872  		{"R_AARCH64_MOVW_UABS_G3", Const, 4, ""},
  2873  		{"R_AARCH64_NONE", Const, 4, ""},
  2874  		{"R_AARCH64_NULL", Const, 4, ""},
  2875  		{"R_AARCH64_P32_ABS16", Const, 4, ""},
  2876  		{"R_AARCH64_P32_ABS32", Const, 4, ""},
  2877  		{"R_AARCH64_P32_ADD_ABS_LO12_NC", Const, 4, ""},
  2878  		{"R_AARCH64_P32_ADR_GOT_PAGE", Const, 4, ""},
  2879  		{"R_AARCH64_P32_ADR_PREL_LO21", Const, 4, ""},
  2880  		{"R_AARCH64_P32_ADR_PREL_PG_HI21", Const, 4, ""},
  2881  		{"R_AARCH64_P32_CALL26", Const, 4, ""},
  2882  		{"R_AARCH64_P32_CONDBR19", Const, 4, ""},
  2883  		{"R_AARCH64_P32_COPY", Const, 4, ""},
  2884  		{"R_AARCH64_P32_GLOB_DAT", Const, 4, ""},
  2885  		{"R_AARCH64_P32_GOT_LD_PREL19", Const, 4, ""},
  2886  		{"R_AARCH64_P32_IRELATIVE", Const, 4, ""},
  2887  		{"R_AARCH64_P32_JUMP26", Const, 4, ""},
  2888  		{"R_AARCH64_P32_JUMP_SLOT", Const, 4, ""},
  2889  		{"R_AARCH64_P32_LD32_GOT_LO12_NC", Const, 4, ""},
  2890  		{"R_AARCH64_P32_LDST128_ABS_LO12_NC", Const, 4, ""},
  2891  		{"R_AARCH64_P32_LDST16_ABS_LO12_NC", Const, 4, ""},
  2892  		{"R_AARCH64_P32_LDST32_ABS_LO12_NC", Const, 4, ""},
  2893  		{"R_AARCH64_P32_LDST64_ABS_LO12_NC", Const, 4, ""},
  2894  		{"R_AARCH64_P32_LDST8_ABS_LO12_NC", Const, 4, ""},
  2895  		{"R_AARCH64_P32_LD_PREL_LO19", Const, 4, ""},
  2896  		{"R_AARCH64_P32_MOVW_SABS_G0", Const, 4, ""},
  2897  		{"R_AARCH64_P32_MOVW_UABS_G0", Const, 4, ""},
  2898  		{"R_AARCH64_P32_MOVW_UABS_G0_NC", Const, 4, ""},
  2899  		{"R_AARCH64_P32_MOVW_UABS_G1", Const, 4, ""},
  2900  		{"R_AARCH64_P32_PREL16", Const, 4, ""},
  2901  		{"R_AARCH64_P32_PREL32", Const, 4, ""},
  2902  		{"R_AARCH64_P32_RELATIVE", Const, 4, ""},
  2903  		{"R_AARCH64_P32_TLSDESC", Const, 4, ""},
  2904  		{"R_AARCH64_P32_TLSDESC_ADD_LO12_NC", Const, 4, ""},
  2905  		{"R_AARCH64_P32_TLSDESC_ADR_PAGE21", Const, 4, ""},
  2906  		{"R_AARCH64_P32_TLSDESC_ADR_PREL21", Const, 4, ""},
  2907  		{"R_AARCH64_P32_TLSDESC_CALL", Const, 4, ""},
  2908  		{"R_AARCH64_P32_TLSDESC_LD32_LO12_NC", Const, 4, ""},
  2909  		{"R_AARCH64_P32_TLSDESC_LD_PREL19", Const, 4, ""},
  2910  		{"R_AARCH64_P32_TLSGD_ADD_LO12_NC", Const, 4, ""},
  2911  		{"R_AARCH64_P32_TLSGD_ADR_PAGE21", Const, 4, ""},
  2912  		{"R_AARCH64_P32_TLSIE_ADR_GOTTPREL_PAGE21", Const, 4, ""},
  2913  		{"R_AARCH64_P32_TLSIE_LD32_GOTTPREL_LO12_NC", Const, 4, ""},
  2914  		{"R_AARCH64_P32_TLSIE_LD_GOTTPREL_PREL19", Const, 4, ""},
  2915  		{"R_AARCH64_P32_TLSLE_ADD_TPREL_HI12", Const, 4, ""},
  2916  		{"R_AARCH64_P32_TLSLE_ADD_TPREL_LO12", Const, 4, ""},
  2917  		{"R_AARCH64_P32_TLSLE_ADD_TPREL_LO12_NC", Const, 4, ""},
  2918  		{"R_AARCH64_P32_TLSLE_MOVW_TPREL_G0", Const, 4, ""},
  2919  		{"R_AARCH64_P32_TLSLE_MOVW_TPREL_G0_NC", Const, 4, ""},
  2920  		{"R_AARCH64_P32_TLSLE_MOVW_TPREL_G1", Const, 4, ""},
  2921  		{"R_AARCH64_P32_TLS_DTPMOD", Const, 4, ""},
  2922  		{"R_AARCH64_P32_TLS_DTPREL", Const, 4, ""},
  2923  		{"R_AARCH64_P32_TLS_TPREL", Const, 4, ""},
  2924  		{"R_AARCH64_P32_TSTBR14", Const, 4, ""},
  2925  		{"R_AARCH64_PREL16", Const, 4, ""},
  2926  		{"R_AARCH64_PREL32", Const, 4, ""},
  2927  		{"R_AARCH64_PREL64", Const, 4, ""},
  2928  		{"R_AARCH64_RELATIVE", Const, 4, ""},
  2929  		{"R_AARCH64_TLSDESC", Const, 4, ""},
  2930  		{"R_AARCH64_TLSDESC_ADD", Const, 4, ""},
  2931  		{"R_AARCH64_TLSDESC_ADD_LO12_NC", Const, 4, ""},
  2932  		{"R_AARCH64_TLSDESC_ADR_PAGE21", Const, 4, ""},
  2933  		{"R_AARCH64_TLSDESC_ADR_PREL21", Const, 4, ""},
  2934  		{"R_AARCH64_TLSDESC_CALL", Const, 4, ""},
  2935  		{"R_AARCH64_TLSDESC_LD64_LO12_NC", Const, 4, ""},
  2936  		{"R_AARCH64_TLSDESC_LDR", Const, 4, ""},
  2937  		{"R_AARCH64_TLSDESC_LD_PREL19", Const, 4, ""},
  2938  		{"R_AARCH64_TLSDESC_OFF_G0_NC", Const, 4, ""},
  2939  		{"R_AARCH64_TLSDESC_OFF_G1", Const, 4, ""},
  2940  		{"R_AARCH64_TLSGD_ADD_LO12_NC", Const, 4, ""},
  2941  		{"R_AARCH64_TLSGD_ADR_PAGE21", Const, 4, ""},
  2942  		{"R_AARCH64_TLSGD_ADR_PREL21", Const, 10, ""},
  2943  		{"R_AARCH64_TLSGD_MOVW_G0_NC", Const, 10, ""},
  2944  		{"R_AARCH64_TLSGD_MOVW_G1", Const, 10, ""},
  2945  		{"R_AARCH64_TLSIE_ADR_GOTTPREL_PAGE21", Const, 4, ""},
  2946  		{"R_AARCH64_TLSIE_LD64_GOTTPREL_LO12_NC", Const, 4, ""},
  2947  		{"R_AARCH64_TLSIE_LD_GOTTPREL_PREL19", Const, 4, ""},
  2948  		{"R_AARCH64_TLSIE_MOVW_GOTTPREL_G0_NC", Const, 4, ""},
  2949  		{"R_AARCH64_TLSIE_MOVW_GOTTPREL_G1", Const, 4, ""},
  2950  		{"R_AARCH64_TLSLD_ADR_PAGE21", Const, 10, ""},
  2951  		{"R_AARCH64_TLSLD_ADR_PREL21", Const, 10, ""},
  2952  		{"R_AARCH64_TLSLD_LDST128_DTPREL_LO12", Const, 10, ""},
  2953  		{"R_AARCH64_TLSLD_LDST128_DTPREL_LO12_NC", Const, 10, ""},
  2954  		{"R_AARCH64_TLSLE_ADD_TPREL_HI12", Const, 4, ""},
  2955  		{"R_AARCH64_TLSLE_ADD_TPREL_LO12", Const, 4, ""},
  2956  		{"R_AARCH64_TLSLE_ADD_TPREL_LO12_NC", Const, 4, ""},
  2957  		{"R_AARCH64_TLSLE_LDST128_TPREL_LO12", Const, 10, ""},
  2958  		{"R_AARCH64_TLSLE_LDST128_TPREL_LO12_NC", Const, 10, ""},
  2959  		{"R_AARCH64_TLSLE_MOVW_TPREL_G0", Const, 4, ""},
  2960  		{"R_AARCH64_TLSLE_MOVW_TPREL_G0_NC", Const, 4, ""},
  2961  		{"R_AARCH64_TLSLE_MOVW_TPREL_G1", Const, 4, ""},
  2962  		{"R_AARCH64_TLSLE_MOVW_TPREL_G1_NC", Const, 4, ""},
  2963  		{"R_AARCH64_TLSLE_MOVW_TPREL_G2", Const, 4, ""},
  2964  		{"R_AARCH64_TLS_DTPMOD64", Const, 4, ""},
  2965  		{"R_AARCH64_TLS_DTPREL64", Const, 4, ""},
  2966  		{"R_AARCH64_TLS_TPREL64", Const, 4, ""},
  2967  		{"R_AARCH64_TSTBR14", Const, 4, ""},
  2968  		{"R_ALPHA", Type, 0, ""},
  2969  		{"R_ALPHA_BRADDR", Const, 0, ""},
  2970  		{"R_ALPHA_COPY", Const, 0, ""},
  2971  		{"R_ALPHA_GLOB_DAT", Const, 0, ""},
  2972  		{"R_ALPHA_GPDISP", Const, 0, ""},
  2973  		{"R_ALPHA_GPREL32", Const, 0, ""},
  2974  		{"R_ALPHA_GPRELHIGH", Const, 0, ""},
  2975  		{"R_ALPHA_GPRELLOW", Const, 0, ""},
  2976  		{"R_ALPHA_GPVALUE", Const, 0, ""},
  2977  		{"R_ALPHA_HINT", Const, 0, ""},
  2978  		{"R_ALPHA_IMMED_BR_HI32", Const, 0, ""},
  2979  		{"R_ALPHA_IMMED_GP_16", Const, 0, ""},
  2980  		{"R_ALPHA_IMMED_GP_HI32", Const, 0, ""},
  2981  		{"R_ALPHA_IMMED_LO32", Const, 0, ""},
  2982  		{"R_ALPHA_IMMED_SCN_HI32", Const, 0, ""},
  2983  		{"R_ALPHA_JMP_SLOT", Const, 0, ""},
  2984  		{"R_ALPHA_LITERAL", Const, 0, ""},
  2985  		{"R_ALPHA_LITUSE", Const, 0, ""},
  2986  		{"R_ALPHA_NONE", Const, 0, ""},
  2987  		{"R_ALPHA_OP_PRSHIFT", Const, 0, ""},
  2988  		{"R_ALPHA_OP_PSUB", Const, 0, ""},
  2989  		{"R_ALPHA_OP_PUSH", Const, 0, ""},
  2990  		{"R_ALPHA_OP_STORE", Const, 0, ""},
  2991  		{"R_ALPHA_REFLONG", Const, 0, ""},
  2992  		{"R_ALPHA_REFQUAD", Const, 0, ""},
  2993  		{"R_ALPHA_RELATIVE", Const, 0, ""},
  2994  		{"R_ALPHA_SREL16", Const, 0, ""},
  2995  		{"R_ALPHA_SREL32", Const, 0, ""},
  2996  		{"R_ALPHA_SREL64", Const, 0, ""},
  2997  		{"R_ARM", Type, 0, ""},
  2998  		{"R_ARM_ABS12", Const, 0, ""},
  2999  		{"R_ARM_ABS16", Const, 0, ""},
  3000  		{"R_ARM_ABS32", Const, 0, ""},
  3001  		{"R_ARM_ABS32_NOI", Const, 10, ""},
  3002  		{"R_ARM_ABS8", Const, 0, ""},
  3003  		{"R_ARM_ALU_PCREL_15_8", Const, 10, ""},
  3004  		{"R_ARM_ALU_PCREL_23_15", Const, 10, ""},
  3005  		{"R_ARM_ALU_PCREL_7_0", Const, 10, ""},
  3006  		{"R_ARM_ALU_PC_G0", Const, 10, ""},
  3007  		{"R_ARM_ALU_PC_G0_NC", Const, 10, ""},
  3008  		{"R_ARM_ALU_PC_G1", Const, 10, ""},
  3009  		{"R_ARM_ALU_PC_G1_NC", Const, 10, ""},
  3010  		{"R_ARM_ALU_PC_G2", Const, 10, ""},
  3011  		{"R_ARM_ALU_SBREL_19_12_NC", Const, 10, ""},
  3012  		{"R_ARM_ALU_SBREL_27_20_CK", Const, 10, ""},
  3013  		{"R_ARM_ALU_SB_G0", Const, 10, ""},
  3014  		{"R_ARM_ALU_SB_G0_NC", Const, 10, ""},
  3015  		{"R_ARM_ALU_SB_G1", Const, 10, ""},
  3016  		{"R_ARM_ALU_SB_G1_NC", Const, 10, ""},
  3017  		{"R_ARM_ALU_SB_G2", Const, 10, ""},
  3018  		{"R_ARM_AMP_VCALL9", Const, 0, ""},
  3019  		{"R_ARM_BASE_ABS", Const, 10, ""},
  3020  		{"R_ARM_CALL", Const, 10, ""},
  3021  		{"R_ARM_COPY", Const, 0, ""},
  3022  		{"R_ARM_GLOB_DAT", Const, 0, ""},
  3023  		{"R_ARM_GNU_VTENTRY", Const, 0, ""},
  3024  		{"R_ARM_GNU_VTINHERIT", Const, 0, ""},
  3025  		{"R_ARM_GOT32", Const, 0, ""},
  3026  		{"R_ARM_GOTOFF", Const, 0, ""},
  3027  		{"R_ARM_GOTOFF12", Const, 10, ""},
  3028  		{"R_ARM_GOTPC", Const, 0, ""},
  3029  		{"R_ARM_GOTRELAX", Const, 10, ""},
  3030  		{"R_ARM_GOT_ABS", Const, 10, ""},
  3031  		{"R_ARM_GOT_BREL12", Const, 10, ""},
  3032  		{"R_ARM_GOT_PREL", Const, 10, ""},
  3033  		{"R_ARM_IRELATIVE", Const, 10, ""},
  3034  		{"R_ARM_JUMP24", Const, 10, ""},
  3035  		{"R_ARM_JUMP_SLOT", Const, 0, ""},
  3036  		{"R_ARM_LDC_PC_G0", Const, 10, ""},
  3037  		{"R_ARM_LDC_PC_G1", Const, 10, ""},
  3038  		{"R_ARM_LDC_PC_G2", Const, 10, ""},
  3039  		{"R_ARM_LDC_SB_G0", Const, 10, ""},
  3040  		{"R_ARM_LDC_SB_G1", Const, 10, ""},
  3041  		{"R_ARM_LDC_SB_G2", Const, 10, ""},
  3042  		{"R_ARM_LDRS_PC_G0", Const, 10, ""},
  3043  		{"R_ARM_LDRS_PC_G1", Const, 10, ""},
  3044  		{"R_ARM_LDRS_PC_G2", Const, 10, ""},
  3045  		{"R_ARM_LDRS_SB_G0", Const, 10, ""},
  3046  		{"R_ARM_LDRS_SB_G1", Const, 10, ""},
  3047  		{"R_ARM_LDRS_SB_G2", Const, 10, ""},
  3048  		{"R_ARM_LDR_PC_G1", Const, 10, ""},
  3049  		{"R_ARM_LDR_PC_G2", Const, 10, ""},
  3050  		{"R_ARM_LDR_SBREL_11_10_NC", Const, 10, ""},
  3051  		{"R_ARM_LDR_SB_G0", Const, 10, ""},
  3052  		{"R_ARM_LDR_SB_G1", Const, 10, ""},
  3053  		{"R_ARM_LDR_SB_G2", Const, 10, ""},
  3054  		{"R_ARM_ME_TOO", Const, 10, ""},
  3055  		{"R_ARM_MOVT_ABS", Const, 10, ""},
  3056  		{"R_ARM_MOVT_BREL", Const, 10, ""},
  3057  		{"R_ARM_MOVT_PREL", Const, 10, ""},
  3058  		{"R_ARM_MOVW_ABS_NC", Const, 10, ""},
  3059  		{"R_ARM_MOVW_BREL", Const, 10, ""},
  3060  		{"R_ARM_MOVW_BREL_NC", Const, 10, ""},
  3061  		{"R_ARM_MOVW_PREL_NC", Const, 10, ""},
  3062  		{"R_ARM_NONE", Const, 0, ""},
  3063  		{"R_ARM_PC13", Const, 0, ""},
  3064  		{"R_ARM_PC24", Const, 0, ""},
  3065  		{"R_ARM_PLT32", Const, 0, ""},
  3066  		{"R_ARM_PLT32_ABS", Const, 10, ""},
  3067  		{"R_ARM_PREL31", Const, 10, ""},
  3068  		{"R_ARM_PRIVATE_0", Const, 10, ""},
  3069  		{"R_ARM_PRIVATE_1", Const, 10, ""},
  3070  		{"R_ARM_PRIVATE_10", Const, 10, ""},
  3071  		{"R_ARM_PRIVATE_11", Const, 10, ""},
  3072  		{"R_ARM_PRIVATE_12", Const, 10, ""},
  3073  		{"R_ARM_PRIVATE_13", Const, 10, ""},
  3074  		{"R_ARM_PRIVATE_14", Const, 10, ""},
  3075  		{"R_ARM_PRIVATE_15", Const, 10, ""},
  3076  		{"R_ARM_PRIVATE_2", Const, 10, ""},
  3077  		{"R_ARM_PRIVATE_3", Const, 10, ""},
  3078  		{"R_ARM_PRIVATE_4", Const, 10, ""},
  3079  		{"R_ARM_PRIVATE_5", Const, 10, ""},
  3080  		{"R_ARM_PRIVATE_6", Const, 10, ""},
  3081  		{"R_ARM_PRIVATE_7", Const, 10, ""},
  3082  		{"R_ARM_PRIVATE_8", Const, 10, ""},
  3083  		{"R_ARM_PRIVATE_9", Const, 10, ""},
  3084  		{"R_ARM_RABS32", Const, 0, ""},
  3085  		{"R_ARM_RBASE", Const, 0, ""},
  3086  		{"R_ARM_REL32", Const, 0, ""},
  3087  		{"R_ARM_REL32_NOI", Const, 10, ""},
  3088  		{"R_ARM_RELATIVE", Const, 0, ""},
  3089  		{"R_ARM_RPC24", Const, 0, ""},
  3090  		{"R_ARM_RREL32", Const, 0, ""},
  3091  		{"R_ARM_RSBREL32", Const, 0, ""},
  3092  		{"R_ARM_RXPC25", Const, 10, ""},
  3093  		{"R_ARM_SBREL31", Const, 10, ""},
  3094  		{"R_ARM_SBREL32", Const, 0, ""},
  3095  		{"R_ARM_SWI24", Const, 0, ""},
  3096  		{"R_ARM_TARGET1", Const, 10, ""},
  3097  		{"R_ARM_TARGET2", Const, 10, ""},
  3098  		{"R_ARM_THM_ABS5", Const, 0, ""},
  3099  		{"R_ARM_THM_ALU_ABS_G0_NC", Const, 10, ""},
  3100  		{"R_ARM_THM_ALU_ABS_G1_NC", Const, 10, ""},
  3101  		{"R_ARM_THM_ALU_ABS_G2_NC", Const, 10, ""},
  3102  		{"R_ARM_THM_ALU_ABS_G3", Const, 10, ""},
  3103  		{"R_ARM_THM_ALU_PREL_11_0", Const, 10, ""},
  3104  		{"R_ARM_THM_GOT_BREL12", Const, 10, ""},
  3105  		{"R_ARM_THM_JUMP11", Const, 10, ""},
  3106  		{"R_ARM_THM_JUMP19", Const, 10, ""},
  3107  		{"R_ARM_THM_JUMP24", Const, 10, ""},
  3108  		{"R_ARM_THM_JUMP6", Const, 10, ""},
  3109  		{"R_ARM_THM_JUMP8", Const, 10, ""},
  3110  		{"R_ARM_THM_MOVT_ABS", Const, 10, ""},
  3111  		{"R_ARM_THM_MOVT_BREL", Const, 10, ""},
  3112  		{"R_ARM_THM_MOVT_PREL", Const, 10, ""},
  3113  		{"R_ARM_THM_MOVW_ABS_NC", Const, 10, ""},
  3114  		{"R_ARM_THM_MOVW_BREL", Const, 10, ""},
  3115  		{"R_ARM_THM_MOVW_BREL_NC", Const, 10, ""},
  3116  		{"R_ARM_THM_MOVW_PREL_NC", Const, 10, ""},
  3117  		{"R_ARM_THM_PC12", Const, 10, ""},
  3118  		{"R_ARM_THM_PC22", Const, 0, ""},
  3119  		{"R_ARM_THM_PC8", Const, 0, ""},
  3120  		{"R_ARM_THM_RPC22", Const, 0, ""},
  3121  		{"R_ARM_THM_SWI8", Const, 0, ""},
  3122  		{"R_ARM_THM_TLS_CALL", Const, 10, ""},
  3123  		{"R_ARM_THM_TLS_DESCSEQ16", Const, 10, ""},
  3124  		{"R_ARM_THM_TLS_DESCSEQ32", Const, 10, ""},
  3125  		{"R_ARM_THM_XPC22", Const, 0, ""},
  3126  		{"R_ARM_TLS_CALL", Const, 10, ""},
  3127  		{"R_ARM_TLS_DESCSEQ", Const, 10, ""},
  3128  		{"R_ARM_TLS_DTPMOD32", Const, 10, ""},
  3129  		{"R_ARM_TLS_DTPOFF32", Const, 10, ""},
  3130  		{"R_ARM_TLS_GD32", Const, 10, ""},
  3131  		{"R_ARM_TLS_GOTDESC", Const, 10, ""},
  3132  		{"R_ARM_TLS_IE12GP", Const, 10, ""},
  3133  		{"R_ARM_TLS_IE32", Const, 10, ""},
  3134  		{"R_ARM_TLS_LDM32", Const, 10, ""},
  3135  		{"R_ARM_TLS_LDO12", Const, 10, ""},
  3136  		{"R_ARM_TLS_LDO32", Const, 10, ""},
  3137  		{"R_ARM_TLS_LE12", Const, 10, ""},
  3138  		{"R_ARM_TLS_LE32", Const, 10, ""},
  3139  		{"R_ARM_TLS_TPOFF32", Const, 10, ""},
  3140  		{"R_ARM_V4BX", Const, 10, ""},
  3141  		{"R_ARM_XPC25", Const, 0, ""},
  3142  		{"R_INFO", Func, 0, "func(sym uint32, typ uint32) uint64"},
  3143  		{"R_INFO32", Func, 0, "func(sym uint32, typ uint32) uint32"},
  3144  		{"R_LARCH", Type, 19, ""},
  3145  		{"R_LARCH_32", Const, 19, ""},
  3146  		{"R_LARCH_32_PCREL", Const, 20, ""},
  3147  		{"R_LARCH_64", Const, 19, ""},
  3148  		{"R_LARCH_64_PCREL", Const, 22, ""},
  3149  		{"R_LARCH_ABS64_HI12", Const, 20, ""},
  3150  		{"R_LARCH_ABS64_LO20", Const, 20, ""},
  3151  		{"R_LARCH_ABS_HI20", Const, 20, ""},
  3152  		{"R_LARCH_ABS_LO12", Const, 20, ""},
  3153  		{"R_LARCH_ADD16", Const, 19, ""},
  3154  		{"R_LARCH_ADD24", Const, 19, ""},
  3155  		{"R_LARCH_ADD32", Const, 19, ""},
  3156  		{"R_LARCH_ADD6", Const, 22, ""},
  3157  		{"R_LARCH_ADD64", Const, 19, ""},
  3158  		{"R_LARCH_ADD8", Const, 19, ""},
  3159  		{"R_LARCH_ADD_ULEB128", Const, 22, ""},
  3160  		{"R_LARCH_ALIGN", Const, 22, ""},
  3161  		{"R_LARCH_B16", Const, 20, ""},
  3162  		{"R_LARCH_B21", Const, 20, ""},
  3163  		{"R_LARCH_B26", Const, 20, ""},
  3164  		{"R_LARCH_CFA", Const, 22, ""},
  3165  		{"R_LARCH_COPY", Const, 19, ""},
  3166  		{"R_LARCH_DELETE", Const, 22, ""},
  3167  		{"R_LARCH_GNU_VTENTRY", Const, 20, ""},
  3168  		{"R_LARCH_GNU_VTINHERIT", Const, 20, ""},
  3169  		{"R_LARCH_GOT64_HI12", Const, 20, ""},
  3170  		{"R_LARCH_GOT64_LO20", Const, 20, ""},
  3171  		{"R_LARCH_GOT64_PC_HI12", Const, 20, ""},
  3172  		{"R_LARCH_GOT64_PC_LO20", Const, 20, ""},
  3173  		{"R_LARCH_GOT_HI20", Const, 20, ""},
  3174  		{"R_LARCH_GOT_LO12", Const, 20, ""},
  3175  		{"R_LARCH_GOT_PC_HI20", Const, 20, ""},
  3176  		{"R_LARCH_GOT_PC_LO12", Const, 20, ""},
  3177  		{"R_LARCH_IRELATIVE", Const, 19, ""},
  3178  		{"R_LARCH_JUMP_SLOT", Const, 19, ""},
  3179  		{"R_LARCH_MARK_LA", Const, 19, ""},
  3180  		{"R_LARCH_MARK_PCREL", Const, 19, ""},
  3181  		{"R_LARCH_NONE", Const, 19, ""},
  3182  		{"R_LARCH_PCALA64_HI12", Const, 20, ""},
  3183  		{"R_LARCH_PCALA64_LO20", Const, 20, ""},
  3184  		{"R_LARCH_PCALA_HI20", Const, 20, ""},
  3185  		{"R_LARCH_PCALA_LO12", Const, 20, ""},
  3186  		{"R_LARCH_PCREL20_S2", Const, 22, ""},
  3187  		{"R_LARCH_RELATIVE", Const, 19, ""},
  3188  		{"R_LARCH_RELAX", Const, 20, ""},
  3189  		{"R_LARCH_SOP_ADD", Const, 19, ""},
  3190  		{"R_LARCH_SOP_AND", Const, 19, ""},
  3191  		{"R_LARCH_SOP_ASSERT", Const, 19, ""},
  3192  		{"R_LARCH_SOP_IF_ELSE", Const, 19, ""},
  3193  		{"R_LARCH_SOP_NOT", Const, 19, ""},
  3194  		{"R_LARCH_SOP_POP_32_S_0_10_10_16_S2", Const, 19, ""},
  3195  		{"R_LARCH_SOP_POP_32_S_0_5_10_16_S2", Const, 19, ""},
  3196  		{"R_LARCH_SOP_POP_32_S_10_12", Const, 19, ""},
  3197  		{"R_LARCH_SOP_POP_32_S_10_16", Const, 19, ""},
  3198  		{"R_LARCH_SOP_POP_32_S_10_16_S2", Const, 19, ""},
  3199  		{"R_LARCH_SOP_POP_32_S_10_5", Const, 19, ""},
  3200  		{"R_LARCH_SOP_POP_32_S_5_20", Const, 19, ""},
  3201  		{"R_LARCH_SOP_POP_32_U", Const, 19, ""},
  3202  		{"R_LARCH_SOP_POP_32_U_10_12", Const, 19, ""},
  3203  		{"R_LARCH_SOP_PUSH_ABSOLUTE", Const, 19, ""},
  3204  		{"R_LARCH_SOP_PUSH_DUP", Const, 19, ""},
  3205  		{"R_LARCH_SOP_PUSH_GPREL", Const, 19, ""},
  3206  		{"R_LARCH_SOP_PUSH_PCREL", Const, 19, ""},
  3207  		{"R_LARCH_SOP_PUSH_PLT_PCREL", Const, 19, ""},
  3208  		{"R_LARCH_SOP_PUSH_TLS_GD", Const, 19, ""},
  3209  		{"R_LARCH_SOP_PUSH_TLS_GOT", Const, 19, ""},
  3210  		{"R_LARCH_SOP_PUSH_TLS_TPREL", Const, 19, ""},
  3211  		{"R_LARCH_SOP_SL", Const, 19, ""},
  3212  		{"R_LARCH_SOP_SR", Const, 19, ""},
  3213  		{"R_LARCH_SOP_SUB", Const, 19, ""},
  3214  		{"R_LARCH_SUB16", Const, 19, ""},
  3215  		{"R_LARCH_SUB24", Const, 19, ""},
  3216  		{"R_LARCH_SUB32", Const, 19, ""},
  3217  		{"R_LARCH_SUB6", Const, 22, ""},
  3218  		{"R_LARCH_SUB64", Const, 19, ""},
  3219  		{"R_LARCH_SUB8", Const, 19, ""},
  3220  		{"R_LARCH_SUB_ULEB128", Const, 22, ""},
  3221  		{"R_LARCH_TLS_DTPMOD32", Const, 19, ""},
  3222  		{"R_LARCH_TLS_DTPMOD64", Const, 19, ""},
  3223  		{"R_LARCH_TLS_DTPREL32", Const, 19, ""},
  3224  		{"R_LARCH_TLS_DTPREL64", Const, 19, ""},
  3225  		{"R_LARCH_TLS_GD_HI20", Const, 20, ""},
  3226  		{"R_LARCH_TLS_GD_PC_HI20", Const, 20, ""},
  3227  		{"R_LARCH_TLS_IE64_HI12", Const, 20, ""},
  3228  		{"R_LARCH_TLS_IE64_LO20", Const, 20, ""},
  3229  		{"R_LARCH_TLS_IE64_PC_HI12", Const, 20, ""},
  3230  		{"R_LARCH_TLS_IE64_PC_LO20", Const, 20, ""},
  3231  		{"R_LARCH_TLS_IE_HI20", Const, 20, ""},
  3232  		{"R_LARCH_TLS_IE_LO12", Const, 20, ""},
  3233  		{"R_LARCH_TLS_IE_PC_HI20", Const, 20, ""},
  3234  		{"R_LARCH_TLS_IE_PC_LO12", Const, 20, ""},
  3235  		{"R_LARCH_TLS_LD_HI20", Const, 20, ""},
  3236  		{"R_LARCH_TLS_LD_PC_HI20", Const, 20, ""},
  3237  		{"R_LARCH_TLS_LE64_HI12", Const, 20, ""},
  3238  		{"R_LARCH_TLS_LE64_LO20", Const, 20, ""},
  3239  		{"R_LARCH_TLS_LE_HI20", Const, 20, ""},
  3240  		{"R_LARCH_TLS_LE_LO12", Const, 20, ""},
  3241  		{"R_LARCH_TLS_TPREL32", Const, 19, ""},
  3242  		{"R_LARCH_TLS_TPREL64", Const, 19, ""},
  3243  		{"R_MIPS", Type, 6, ""},
  3244  		{"R_MIPS_16", Const, 6, ""},
  3245  		{"R_MIPS_26", Const, 6, ""},
  3246  		{"R_MIPS_32", Const, 6, ""},
  3247  		{"R_MIPS_64", Const, 6, ""},
  3248  		{"R_MIPS_ADD_IMMEDIATE", Const, 6, ""},
  3249  		{"R_MIPS_CALL16", Const, 6, ""},
  3250  		{"R_MIPS_CALL_HI16", Const, 6, ""},
  3251  		{"R_MIPS_CALL_LO16", Const, 6, ""},
  3252  		{"R_MIPS_DELETE", Const, 6, ""},
  3253  		{"R_MIPS_GOT16", Const, 6, ""},
  3254  		{"R_MIPS_GOT_DISP", Const, 6, ""},
  3255  		{"R_MIPS_GOT_HI16", Const, 6, ""},
  3256  		{"R_MIPS_GOT_LO16", Const, 6, ""},
  3257  		{"R_MIPS_GOT_OFST", Const, 6, ""},
  3258  		{"R_MIPS_GOT_PAGE", Const, 6, ""},
  3259  		{"R_MIPS_GPREL16", Const, 6, ""},
  3260  		{"R_MIPS_GPREL32", Const, 6, ""},
  3261  		{"R_MIPS_HI16", Const, 6, ""},
  3262  		{"R_MIPS_HIGHER", Const, 6, ""},
  3263  		{"R_MIPS_HIGHEST", Const, 6, ""},
  3264  		{"R_MIPS_INSERT_A", Const, 6, ""},
  3265  		{"R_MIPS_INSERT_B", Const, 6, ""},
  3266  		{"R_MIPS_JALR", Const, 6, ""},
  3267  		{"R_MIPS_LITERAL", Const, 6, ""},
  3268  		{"R_MIPS_LO16", Const, 6, ""},
  3269  		{"R_MIPS_NONE", Const, 6, ""},
  3270  		{"R_MIPS_PC16", Const, 6, ""},
  3271  		{"R_MIPS_PC32", Const, 22, ""},
  3272  		{"R_MIPS_PJUMP", Const, 6, ""},
  3273  		{"R_MIPS_REL16", Const, 6, ""},
  3274  		{"R_MIPS_REL32", Const, 6, ""},
  3275  		{"R_MIPS_RELGOT", Const, 6, ""},
  3276  		{"R_MIPS_SCN_DISP", Const, 6, ""},
  3277  		{"R_MIPS_SHIFT5", Const, 6, ""},
  3278  		{"R_MIPS_SHIFT6", Const, 6, ""},
  3279  		{"R_MIPS_SUB", Const, 6, ""},
  3280  		{"R_MIPS_TLS_DTPMOD32", Const, 6, ""},
  3281  		{"R_MIPS_TLS_DTPMOD64", Const, 6, ""},
  3282  		{"R_MIPS_TLS_DTPREL32", Const, 6, ""},
  3283  		{"R_MIPS_TLS_DTPREL64", Const, 6, ""},
  3284  		{"R_MIPS_TLS_DTPREL_HI16", Const, 6, ""},
  3285  		{"R_MIPS_TLS_DTPREL_LO16", Const, 6, ""},
  3286  		{"R_MIPS_TLS_GD", Const, 6, ""},
  3287  		{"R_MIPS_TLS_GOTTPREL", Const, 6, ""},
  3288  		{"R_MIPS_TLS_LDM", Const, 6, ""},
  3289  		{"R_MIPS_TLS_TPREL32", Const, 6, ""},
  3290  		{"R_MIPS_TLS_TPREL64", Const, 6, ""},
  3291  		{"R_MIPS_TLS_TPREL_HI16", Const, 6, ""},
  3292  		{"R_MIPS_TLS_TPREL_LO16", Const, 6, ""},
  3293  		{"R_PPC", Type, 0, ""},
  3294  		{"R_PPC64", Type, 5, ""},
  3295  		{"R_PPC64_ADDR14", Const, 5, ""},
  3296  		{"R_PPC64_ADDR14_BRNTAKEN", Const, 5, ""},
  3297  		{"R_PPC64_ADDR14_BRTAKEN", Const, 5, ""},
  3298  		{"R_PPC64_ADDR16", Const, 5, ""},
  3299  		{"R_PPC64_ADDR16_DS", Const, 5, ""},
  3300  		{"R_PPC64_ADDR16_HA", Const, 5, ""},
  3301  		{"R_PPC64_ADDR16_HI", Const, 5, ""},
  3302  		{"R_PPC64_ADDR16_HIGH", Const, 10, ""},
  3303  		{"R_PPC64_ADDR16_HIGHA", Const, 10, ""},
  3304  		{"R_PPC64_ADDR16_HIGHER", Const, 5, ""},
  3305  		{"R_PPC64_ADDR16_HIGHER34", Const, 20, ""},
  3306  		{"R_PPC64_ADDR16_HIGHERA", Const, 5, ""},
  3307  		{"R_PPC64_ADDR16_HIGHERA34", Const, 20, ""},
  3308  		{"R_PPC64_ADDR16_HIGHEST", Const, 5, ""},
  3309  		{"R_PPC64_ADDR16_HIGHEST34", Const, 20, ""},
  3310  		{"R_PPC64_ADDR16_HIGHESTA", Const, 5, ""},
  3311  		{"R_PPC64_ADDR16_HIGHESTA34", Const, 20, ""},
  3312  		{"R_PPC64_ADDR16_LO", Const, 5, ""},
  3313  		{"R_PPC64_ADDR16_LO_DS", Const, 5, ""},
  3314  		{"R_PPC64_ADDR24", Const, 5, ""},
  3315  		{"R_PPC64_ADDR32", Const, 5, ""},
  3316  		{"R_PPC64_ADDR64", Const, 5, ""},
  3317  		{"R_PPC64_ADDR64_LOCAL", Const, 10, ""},
  3318  		{"R_PPC64_COPY", Const, 20, ""},
  3319  		{"R_PPC64_D28", Const, 20, ""},
  3320  		{"R_PPC64_D34", Const, 20, ""},
  3321  		{"R_PPC64_D34_HA30", Const, 20, ""},
  3322  		{"R_PPC64_D34_HI30", Const, 20, ""},
  3323  		{"R_PPC64_D34_LO", Const, 20, ""},
  3324  		{"R_PPC64_DTPMOD64", Const, 5, ""},
  3325  		{"R_PPC64_DTPREL16", Const, 5, ""},
  3326  		{"R_PPC64_DTPREL16_DS", Const, 5, ""},
  3327  		{"R_PPC64_DTPREL16_HA", Const, 5, ""},
  3328  		{"R_PPC64_DTPREL16_HI", Const, 5, ""},
  3329  		{"R_PPC64_DTPREL16_HIGH", Const, 10, ""},
  3330  		{"R_PPC64_DTPREL16_HIGHA", Const, 10, ""},
  3331  		{"R_PPC64_DTPREL16_HIGHER", Const, 5, ""},
  3332  		{"R_PPC64_DTPREL16_HIGHERA", Const, 5, ""},
  3333  		{"R_PPC64_DTPREL16_HIGHEST", Const, 5, ""},
  3334  		{"R_PPC64_DTPREL16_HIGHESTA", Const, 5, ""},
  3335  		{"R_PPC64_DTPREL16_LO", Const, 5, ""},
  3336  		{"R_PPC64_DTPREL16_LO_DS", Const, 5, ""},
  3337  		{"R_PPC64_DTPREL34", Const, 20, ""},
  3338  		{"R_PPC64_DTPREL64", Const, 5, ""},
  3339  		{"R_PPC64_ENTRY", Const, 10, ""},
  3340  		{"R_PPC64_GLOB_DAT", Const, 20, ""},
  3341  		{"R_PPC64_GNU_VTENTRY", Const, 20, ""},
  3342  		{"R_PPC64_GNU_VTINHERIT", Const, 20, ""},
  3343  		{"R_PPC64_GOT16", Const, 5, ""},
  3344  		{"R_PPC64_GOT16_DS", Const, 5, ""},
  3345  		{"R_PPC64_GOT16_HA", Const, 5, ""},
  3346  		{"R_PPC64_GOT16_HI", Const, 5, ""},
  3347  		{"R_PPC64_GOT16_LO", Const, 5, ""},
  3348  		{"R_PPC64_GOT16_LO_DS", Const, 5, ""},
  3349  		{"R_PPC64_GOT_DTPREL16_DS", Const, 5, ""},
  3350  		{"R_PPC64_GOT_DTPREL16_HA", Const, 5, ""},
  3351  		{"R_PPC64_GOT_DTPREL16_HI", Const, 5, ""},
  3352  		{"R_PPC64_GOT_DTPREL16_LO_DS", Const, 5, ""},
  3353  		{"R_PPC64_GOT_DTPREL_PCREL34", Const, 20, ""},
  3354  		{"R_PPC64_GOT_PCREL34", Const, 20, ""},
  3355  		{"R_PPC64_GOT_TLSGD16", Const, 5, ""},
  3356  		{"R_PPC64_GOT_TLSGD16_HA", Const, 5, ""},
  3357  		{"R_PPC64_GOT_TLSGD16_HI", Const, 5, ""},
  3358  		{"R_PPC64_GOT_TLSGD16_LO", Const, 5, ""},
  3359  		{"R_PPC64_GOT_TLSGD_PCREL34", Const, 20, ""},
  3360  		{"R_PPC64_GOT_TLSLD16", Const, 5, ""},
  3361  		{"R_PPC64_GOT_TLSLD16_HA", Const, 5, ""},
  3362  		{"R_PPC64_GOT_TLSLD16_HI", Const, 5, ""},
  3363  		{"R_PPC64_GOT_TLSLD16_LO", Const, 5, ""},
  3364  		{"R_PPC64_GOT_TLSLD_PCREL34", Const, 20, ""},
  3365  		{"R_PPC64_GOT_TPREL16_DS", Const, 5, ""},
  3366  		{"R_PPC64_GOT_TPREL16_HA", Const, 5, ""},
  3367  		{"R_PPC64_GOT_TPREL16_HI", Const, 5, ""},
  3368  		{"R_PPC64_GOT_TPREL16_LO_DS", Const, 5, ""},
  3369  		{"R_PPC64_GOT_TPREL_PCREL34", Const, 20, ""},
  3370  		{"R_PPC64_IRELATIVE", Const, 10, ""},
  3371  		{"R_PPC64_JMP_IREL", Const, 10, ""},
  3372  		{"R_PPC64_JMP_SLOT", Const, 5, ""},
  3373  		{"R_PPC64_NONE", Const, 5, ""},
  3374  		{"R_PPC64_PCREL28", Const, 20, ""},
  3375  		{"R_PPC64_PCREL34", Const, 20, ""},
  3376  		{"R_PPC64_PCREL_OPT", Const, 20, ""},
  3377  		{"R_PPC64_PLT16_HA", Const, 20, ""},
  3378  		{"R_PPC64_PLT16_HI", Const, 20, ""},
  3379  		{"R_PPC64_PLT16_LO", Const, 20, ""},
  3380  		{"R_PPC64_PLT16_LO_DS", Const, 10, ""},
  3381  		{"R_PPC64_PLT32", Const, 20, ""},
  3382  		{"R_PPC64_PLT64", Const, 20, ""},
  3383  		{"R_PPC64_PLTCALL", Const, 20, ""},
  3384  		{"R_PPC64_PLTCALL_NOTOC", Const, 20, ""},
  3385  		{"R_PPC64_PLTGOT16", Const, 10, ""},
  3386  		{"R_PPC64_PLTGOT16_DS", Const, 10, ""},
  3387  		{"R_PPC64_PLTGOT16_HA", Const, 10, ""},
  3388  		{"R_PPC64_PLTGOT16_HI", Const, 10, ""},
  3389  		{"R_PPC64_PLTGOT16_LO", Const, 10, ""},
  3390  		{"R_PPC64_PLTGOT_LO_DS", Const, 10, ""},
  3391  		{"R_PPC64_PLTREL32", Const, 20, ""},
  3392  		{"R_PPC64_PLTREL64", Const, 20, ""},
  3393  		{"R_PPC64_PLTSEQ", Const, 20, ""},
  3394  		{"R_PPC64_PLTSEQ_NOTOC", Const, 20, ""},
  3395  		{"R_PPC64_PLT_PCREL34", Const, 20, ""},
  3396  		{"R_PPC64_PLT_PCREL34_NOTOC", Const, 20, ""},
  3397  		{"R_PPC64_REL14", Const, 5, ""},
  3398  		{"R_PPC64_REL14_BRNTAKEN", Const, 5, ""},
  3399  		{"R_PPC64_REL14_BRTAKEN", Const, 5, ""},
  3400  		{"R_PPC64_REL16", Const, 5, ""},
  3401  		{"R_PPC64_REL16DX_HA", Const, 10, ""},
  3402  		{"R_PPC64_REL16_HA", Const, 5, ""},
  3403  		{"R_PPC64_REL16_HI", Const, 5, ""},
  3404  		{"R_PPC64_REL16_HIGH", Const, 20, ""},
  3405  		{"R_PPC64_REL16_HIGHA", Const, 20, ""},
  3406  		{"R_PPC64_REL16_HIGHER", Const, 20, ""},
  3407  		{"R_PPC64_REL16_HIGHER34", Const, 20, ""},
  3408  		{"R_PPC64_REL16_HIGHERA", Const, 20, ""},
  3409  		{"R_PPC64_REL16_HIGHERA34", Const, 20, ""},
  3410  		{"R_PPC64_REL16_HIGHEST", Const, 20, ""},
  3411  		{"R_PPC64_REL16_HIGHEST34", Const, 20, ""},
  3412  		{"R_PPC64_REL16_HIGHESTA", Const, 20, ""},
  3413  		{"R_PPC64_REL16_HIGHESTA34", Const, 20, ""},
  3414  		{"R_PPC64_REL16_LO", Const, 5, ""},
  3415  		{"R_PPC64_REL24", Const, 5, ""},
  3416  		{"R_PPC64_REL24_NOTOC", Const, 10, ""},
  3417  		{"R_PPC64_REL24_P9NOTOC", Const, 21, ""},
  3418  		{"R_PPC64_REL30", Const, 20, ""},
  3419  		{"R_PPC64_REL32", Const, 5, ""},
  3420  		{"R_PPC64_REL64", Const, 5, ""},
  3421  		{"R_PPC64_RELATIVE", Const, 18, ""},
  3422  		{"R_PPC64_SECTOFF", Const, 20, ""},
  3423  		{"R_PPC64_SECTOFF_DS", Const, 10, ""},
  3424  		{"R_PPC64_SECTOFF_HA", Const, 20, ""},
  3425  		{"R_PPC64_SECTOFF_HI", Const, 20, ""},
  3426  		{"R_PPC64_SECTOFF_LO", Const, 20, ""},
  3427  		{"R_PPC64_SECTOFF_LO_DS", Const, 10, ""},
  3428  		{"R_PPC64_TLS", Const, 5, ""},
  3429  		{"R_PPC64_TLSGD", Const, 5, ""},
  3430  		{"R_PPC64_TLSLD", Const, 5, ""},
  3431  		{"R_PPC64_TOC", Const, 5, ""},
  3432  		{"R_PPC64_TOC16", Const, 5, ""},
  3433  		{"R_PPC64_TOC16_DS", Const, 5, ""},
  3434  		{"R_PPC64_TOC16_HA", Const, 5, ""},
  3435  		{"R_PPC64_TOC16_HI", Const, 5, ""},
  3436  		{"R_PPC64_TOC16_LO", Const, 5, ""},
  3437  		{"R_PPC64_TOC16_LO_DS", Const, 5, ""},
  3438  		{"R_PPC64_TOCSAVE", Const, 10, ""},
  3439  		{"R_PPC64_TPREL16", Const, 5, ""},
  3440  		{"R_PPC64_TPREL16_DS", Const, 5, ""},
  3441  		{"R_PPC64_TPREL16_HA", Const, 5, ""},
  3442  		{"R_PPC64_TPREL16_HI", Const, 5, ""},
  3443  		{"R_PPC64_TPREL16_HIGH", Const, 10, ""},
  3444  		{"R_PPC64_TPREL16_HIGHA", Const, 10, ""},
  3445  		{"R_PPC64_TPREL16_HIGHER", Const, 5, ""},
  3446  		{"R_PPC64_TPREL16_HIGHERA", Const, 5, ""},
  3447  		{"R_PPC64_TPREL16_HIGHEST", Const, 5, ""},
  3448  		{"R_PPC64_TPREL16_HIGHESTA", Const, 5, ""},
  3449  		{"R_PPC64_TPREL16_LO", Const, 5, ""},
  3450  		{"R_PPC64_TPREL16_LO_DS", Const, 5, ""},
  3451  		{"R_PPC64_TPREL34", Const, 20, ""},
  3452  		{"R_PPC64_TPREL64", Const, 5, ""},
  3453  		{"R_PPC64_UADDR16", Const, 20, ""},
  3454  		{"R_PPC64_UADDR32", Const, 20, ""},
  3455  		{"R_PPC64_UADDR64", Const, 20, ""},
  3456  		{"R_PPC_ADDR14", Const, 0, ""},
  3457  		{"R_PPC_ADDR14_BRNTAKEN", Const, 0, ""},
  3458  		{"R_PPC_ADDR14_BRTAKEN", Const, 0, ""},
  3459  		{"R_PPC_ADDR16", Const, 0, ""},
  3460  		{"R_PPC_ADDR16_HA", Const, 0, ""},
  3461  		{"R_PPC_ADDR16_HI", Const, 0, ""},
  3462  		{"R_PPC_ADDR16_LO", Const, 0, ""},
  3463  		{"R_PPC_ADDR24", Const, 0, ""},
  3464  		{"R_PPC_ADDR32", Const, 0, ""},
  3465  		{"R_PPC_COPY", Const, 0, ""},
  3466  		{"R_PPC_DTPMOD32", Const, 0, ""},
  3467  		{"R_PPC_DTPREL16", Const, 0, ""},
  3468  		{"R_PPC_DTPREL16_HA", Const, 0, ""},
  3469  		{"R_PPC_DTPREL16_HI", Const, 0, ""},
  3470  		{"R_PPC_DTPREL16_LO", Const, 0, ""},
  3471  		{"R_PPC_DTPREL32", Const, 0, ""},
  3472  		{"R_PPC_EMB_BIT_FLD", Const, 0, ""},
  3473  		{"R_PPC_EMB_MRKREF", Const, 0, ""},
  3474  		{"R_PPC_EMB_NADDR16", Const, 0, ""},
  3475  		{"R_PPC_EMB_NADDR16_HA", Const, 0, ""},
  3476  		{"R_PPC_EMB_NADDR16_HI", Const, 0, ""},
  3477  		{"R_PPC_EMB_NADDR16_LO", Const, 0, ""},
  3478  		{"R_PPC_EMB_NADDR32", Const, 0, ""},
  3479  		{"R_PPC_EMB_RELSDA", Const, 0, ""},
  3480  		{"R_PPC_EMB_RELSEC16", Const, 0, ""},
  3481  		{"R_PPC_EMB_RELST_HA", Const, 0, ""},
  3482  		{"R_PPC_EMB_RELST_HI", Const, 0, ""},
  3483  		{"R_PPC_EMB_RELST_LO", Const, 0, ""},
  3484  		{"R_PPC_EMB_SDA21", Const, 0, ""},
  3485  		{"R_PPC_EMB_SDA2I16", Const, 0, ""},
  3486  		{"R_PPC_EMB_SDA2REL", Const, 0, ""},
  3487  		{"R_PPC_EMB_SDAI16", Const, 0, ""},
  3488  		{"R_PPC_GLOB_DAT", Const, 0, ""},
  3489  		{"R_PPC_GOT16", Const, 0, ""},
  3490  		{"R_PPC_GOT16_HA", Const, 0, ""},
  3491  		{"R_PPC_GOT16_HI", Const, 0, ""},
  3492  		{"R_PPC_GOT16_LO", Const, 0, ""},
  3493  		{"R_PPC_GOT_TLSGD16", Const, 0, ""},
  3494  		{"R_PPC_GOT_TLSGD16_HA", Const, 0, ""},
  3495  		{"R_PPC_GOT_TLSGD16_HI", Const, 0, ""},
  3496  		{"R_PPC_GOT_TLSGD16_LO", Const, 0, ""},
  3497  		{"R_PPC_GOT_TLSLD16", Const, 0, ""},
  3498  		{"R_PPC_GOT_TLSLD16_HA", Const, 0, ""},
  3499  		{"R_PPC_GOT_TLSLD16_HI", Const, 0, ""},
  3500  		{"R_PPC_GOT_TLSLD16_LO", Const, 0, ""},
  3501  		{"R_PPC_GOT_TPREL16", Const, 0, ""},
  3502  		{"R_PPC_GOT_TPREL16_HA", Const, 0, ""},
  3503  		{"R_PPC_GOT_TPREL16_HI", Const, 0, ""},
  3504  		{"R_PPC_GOT_TPREL16_LO", Const, 0, ""},
  3505  		{"R_PPC_JMP_SLOT", Const, 0, ""},
  3506  		{"R_PPC_LOCAL24PC", Const, 0, ""},
  3507  		{"R_PPC_NONE", Const, 0, ""},
  3508  		{"R_PPC_PLT16_HA", Const, 0, ""},
  3509  		{"R_PPC_PLT16_HI", Const, 0, ""},
  3510  		{"R_PPC_PLT16_LO", Const, 0, ""},
  3511  		{"R_PPC_PLT32", Const, 0, ""},
  3512  		{"R_PPC_PLTREL24", Const, 0, ""},
  3513  		{"R_PPC_PLTREL32", Const, 0, ""},
  3514  		{"R_PPC_REL14", Const, 0, ""},
  3515  		{"R_PPC_REL14_BRNTAKEN", Const, 0, ""},
  3516  		{"R_PPC_REL14_BRTAKEN", Const, 0, ""},
  3517  		{"R_PPC_REL24", Const, 0, ""},
  3518  		{"R_PPC_REL32", Const, 0, ""},
  3519  		{"R_PPC_RELATIVE", Const, 0, ""},
  3520  		{"R_PPC_SDAREL16", Const, 0, ""},
  3521  		{"R_PPC_SECTOFF", Const, 0, ""},
  3522  		{"R_PPC_SECTOFF_HA", Const, 0, ""},
  3523  		{"R_PPC_SECTOFF_HI", Const, 0, ""},
  3524  		{"R_PPC_SECTOFF_LO", Const, 0, ""},
  3525  		{"R_PPC_TLS", Const, 0, ""},
  3526  		{"R_PPC_TPREL16", Const, 0, ""},
  3527  		{"R_PPC_TPREL16_HA", Const, 0, ""},
  3528  		{"R_PPC_TPREL16_HI", Const, 0, ""},
  3529  		{"R_PPC_TPREL16_LO", Const, 0, ""},
  3530  		{"R_PPC_TPREL32", Const, 0, ""},
  3531  		{"R_PPC_UADDR16", Const, 0, ""},
  3532  		{"R_PPC_UADDR32", Const, 0, ""},
  3533  		{"R_RISCV", Type, 11, ""},
  3534  		{"R_RISCV_32", Const, 11, ""},
  3535  		{"R_RISCV_32_PCREL", Const, 12, ""},
  3536  		{"R_RISCV_64", Const, 11, ""},
  3537  		{"R_RISCV_ADD16", Const, 11, ""},
  3538  		{"R_RISCV_ADD32", Const, 11, ""},
  3539  		{"R_RISCV_ADD64", Const, 11, ""},
  3540  		{"R_RISCV_ADD8", Const, 11, ""},
  3541  		{"R_RISCV_ALIGN", Const, 11, ""},
  3542  		{"R_RISCV_BRANCH", Const, 11, ""},
  3543  		{"R_RISCV_CALL", Const, 11, ""},
  3544  		{"R_RISCV_CALL_PLT", Const, 11, ""},
  3545  		{"R_RISCV_COPY", Const, 11, ""},
  3546  		{"R_RISCV_GNU_VTENTRY", Const, 11, ""},
  3547  		{"R_RISCV_GNU_VTINHERIT", Const, 11, ""},
  3548  		{"R_RISCV_GOT_HI20", Const, 11, ""},
  3549  		{"R_RISCV_GPREL_I", Const, 11, ""},
  3550  		{"R_RISCV_GPREL_S", Const, 11, ""},
  3551  		{"R_RISCV_HI20", Const, 11, ""},
  3552  		{"R_RISCV_JAL", Const, 11, ""},
  3553  		{"R_RISCV_JUMP_SLOT", Const, 11, ""},
  3554  		{"R_RISCV_LO12_I", Const, 11, ""},
  3555  		{"R_RISCV_LO12_S", Const, 11, ""},
  3556  		{"R_RISCV_NONE", Const, 11, ""},
  3557  		{"R_RISCV_PCREL_HI20", Const, 11, ""},
  3558  		{"R_RISCV_PCREL_LO12_I", Const, 11, ""},
  3559  		{"R_RISCV_PCREL_LO12_S", Const, 11, ""},
  3560  		{"R_RISCV_RELATIVE", Const, 11, ""},
  3561  		{"R_RISCV_RELAX", Const, 11, ""},
  3562  		{"R_RISCV_RVC_BRANCH", Const, 11, ""},
  3563  		{"R_RISCV_RVC_JUMP", Const, 11, ""},
  3564  		{"R_RISCV_RVC_LUI", Const, 11, ""},
  3565  		{"R_RISCV_SET16", Const, 11, ""},
  3566  		{"R_RISCV_SET32", Const, 11, ""},
  3567  		{"R_RISCV_SET6", Const, 11, ""},
  3568  		{"R_RISCV_SET8", Const, 11, ""},
  3569  		{"R_RISCV_SUB16", Const, 11, ""},
  3570  		{"R_RISCV_SUB32", Const, 11, ""},
  3571  		{"R_RISCV_SUB6", Const, 11, ""},
  3572  		{"R_RISCV_SUB64", Const, 11, ""},
  3573  		{"R_RISCV_SUB8", Const, 11, ""},
  3574  		{"R_RISCV_TLS_DTPMOD32", Const, 11, ""},
  3575  		{"R_RISCV_TLS_DTPMOD64", Const, 11, ""},
  3576  		{"R_RISCV_TLS_DTPREL32", Const, 11, ""},
  3577  		{"R_RISCV_TLS_DTPREL64", Const, 11, ""},
  3578  		{"R_RISCV_TLS_GD_HI20", Const, 11, ""},
  3579  		{"R_RISCV_TLS_GOT_HI20", Const, 11, ""},
  3580  		{"R_RISCV_TLS_TPREL32", Const, 11, ""},
  3581  		{"R_RISCV_TLS_TPREL64", Const, 11, ""},
  3582  		{"R_RISCV_TPREL_ADD", Const, 11, ""},
  3583  		{"R_RISCV_TPREL_HI20", Const, 11, ""},
  3584  		{"R_RISCV_TPREL_I", Const, 11, ""},
  3585  		{"R_RISCV_TPREL_LO12_I", Const, 11, ""},
  3586  		{"R_RISCV_TPREL_LO12_S", Const, 11, ""},
  3587  		{"R_RISCV_TPREL_S", Const, 11, ""},
  3588  		{"R_SPARC", Type, 0, ""},
  3589  		{"R_SPARC_10", Const, 0, ""},
  3590  		{"R_SPARC_11", Const, 0, ""},
  3591  		{"R_SPARC_13", Const, 0, ""},
  3592  		{"R_SPARC_16", Const, 0, ""},
  3593  		{"R_SPARC_22", Const, 0, ""},
  3594  		{"R_SPARC_32", Const, 0, ""},
  3595  		{"R_SPARC_5", Const, 0, ""},
  3596  		{"R_SPARC_6", Const, 0, ""},
  3597  		{"R_SPARC_64", Const, 0, ""},
  3598  		{"R_SPARC_7", Const, 0, ""},
  3599  		{"R_SPARC_8", Const, 0, ""},
  3600  		{"R_SPARC_COPY", Const, 0, ""},
  3601  		{"R_SPARC_DISP16", Const, 0, ""},
  3602  		{"R_SPARC_DISP32", Const, 0, ""},
  3603  		{"R_SPARC_DISP64", Const, 0, ""},
  3604  		{"R_SPARC_DISP8", Const, 0, ""},
  3605  		{"R_SPARC_GLOB_DAT", Const, 0, ""},
  3606  		{"R_SPARC_GLOB_JMP", Const, 0, ""},
  3607  		{"R_SPARC_GOT10", Const, 0, ""},
  3608  		{"R_SPARC_GOT13", Const, 0, ""},
  3609  		{"R_SPARC_GOT22", Const, 0, ""},
  3610  		{"R_SPARC_H44", Const, 0, ""},
  3611  		{"R_SPARC_HH22", Const, 0, ""},
  3612  		{"R_SPARC_HI22", Const, 0, ""},
  3613  		{"R_SPARC_HIPLT22", Const, 0, ""},
  3614  		{"R_SPARC_HIX22", Const, 0, ""},
  3615  		{"R_SPARC_HM10", Const, 0, ""},
  3616  		{"R_SPARC_JMP_SLOT", Const, 0, ""},
  3617  		{"R_SPARC_L44", Const, 0, ""},
  3618  		{"R_SPARC_LM22", Const, 0, ""},
  3619  		{"R_SPARC_LO10", Const, 0, ""},
  3620  		{"R_SPARC_LOPLT10", Const, 0, ""},
  3621  		{"R_SPARC_LOX10", Const, 0, ""},
  3622  		{"R_SPARC_M44", Const, 0, ""},
  3623  		{"R_SPARC_NONE", Const, 0, ""},
  3624  		{"R_SPARC_OLO10", Const, 0, ""},
  3625  		{"R_SPARC_PC10", Const, 0, ""},
  3626  		{"R_SPARC_PC22", Const, 0, ""},
  3627  		{"R_SPARC_PCPLT10", Const, 0, ""},
  3628  		{"R_SPARC_PCPLT22", Const, 0, ""},
  3629  		{"R_SPARC_PCPLT32", Const, 0, ""},
  3630  		{"R_SPARC_PC_HH22", Const, 0, ""},
  3631  		{"R_SPARC_PC_HM10", Const, 0, ""},
  3632  		{"R_SPARC_PC_LM22", Const, 0, ""},
  3633  		{"R_SPARC_PLT32", Const, 0, ""},
  3634  		{"R_SPARC_PLT64", Const, 0, ""},
  3635  		{"R_SPARC_REGISTER", Const, 0, ""},
  3636  		{"R_SPARC_RELATIVE", Const, 0, ""},
  3637  		{"R_SPARC_UA16", Const, 0, ""},
  3638  		{"R_SPARC_UA32", Const, 0, ""},
  3639  		{"R_SPARC_UA64", Const, 0, ""},
  3640  		{"R_SPARC_WDISP16", Const, 0, ""},
  3641  		{"R_SPARC_WDISP19", Const, 0, ""},
  3642  		{"R_SPARC_WDISP22", Const, 0, ""},
  3643  		{"R_SPARC_WDISP30", Const, 0, ""},
  3644  		{"R_SPARC_WPLT30", Const, 0, ""},
  3645  		{"R_SYM32", Func, 0, "func(info uint32) uint32"},
  3646  		{"R_SYM64", Func, 0, "func(info uint64) uint32"},
  3647  		{"R_TYPE32", Func, 0, "func(info uint32) uint32"},
  3648  		{"R_TYPE64", Func, 0, "func(info uint64) uint32"},
  3649  		{"R_X86_64", Type, 0, ""},
  3650  		{"R_X86_64_16", Const, 0, ""},
  3651  		{"R_X86_64_32", Const, 0, ""},
  3652  		{"R_X86_64_32S", Const, 0, ""},
  3653  		{"R_X86_64_64", Const, 0, ""},
  3654  		{"R_X86_64_8", Const, 0, ""},
  3655  		{"R_X86_64_COPY", Const, 0, ""},
  3656  		{"R_X86_64_DTPMOD64", Const, 0, ""},
  3657  		{"R_X86_64_DTPOFF32", Const, 0, ""},
  3658  		{"R_X86_64_DTPOFF64", Const, 0, ""},
  3659  		{"R_X86_64_GLOB_DAT", Const, 0, ""},
  3660  		{"R_X86_64_GOT32", Const, 0, ""},
  3661  		{"R_X86_64_GOT64", Const, 10, ""},
  3662  		{"R_X86_64_GOTOFF64", Const, 10, ""},
  3663  		{"R_X86_64_GOTPC32", Const, 10, ""},
  3664  		{"R_X86_64_GOTPC32_TLSDESC", Const, 10, ""},
  3665  		{"R_X86_64_GOTPC64", Const, 10, ""},
  3666  		{"R_X86_64_GOTPCREL", Const, 0, ""},
  3667  		{"R_X86_64_GOTPCREL64", Const, 10, ""},
  3668  		{"R_X86_64_GOTPCRELX", Const, 10, ""},
  3669  		{"R_X86_64_GOTPLT64", Const, 10, ""},
  3670  		{"R_X86_64_GOTTPOFF", Const, 0, ""},
  3671  		{"R_X86_64_IRELATIVE", Const, 10, ""},
  3672  		{"R_X86_64_JMP_SLOT", Const, 0, ""},
  3673  		{"R_X86_64_NONE", Const, 0, ""},
  3674  		{"R_X86_64_PC16", Const, 0, ""},
  3675  		{"R_X86_64_PC32", Const, 0, ""},
  3676  		{"R_X86_64_PC32_BND", Const, 10, ""},
  3677  		{"R_X86_64_PC64", Const, 10, ""},
  3678  		{"R_X86_64_PC8", Const, 0, ""},
  3679  		{"R_X86_64_PLT32", Const, 0, ""},
  3680  		{"R_X86_64_PLT32_BND", Const, 10, ""},
  3681  		{"R_X86_64_PLTOFF64", Const, 10, ""},
  3682  		{"R_X86_64_RELATIVE", Const, 0, ""},
  3683  		{"R_X86_64_RELATIVE64", Const, 10, ""},
  3684  		{"R_X86_64_REX_GOTPCRELX", Const, 10, ""},
  3685  		{"R_X86_64_SIZE32", Const, 10, ""},
  3686  		{"R_X86_64_SIZE64", Const, 10, ""},
  3687  		{"R_X86_64_TLSDESC", Const, 10, ""},
  3688  		{"R_X86_64_TLSDESC_CALL", Const, 10, ""},
  3689  		{"R_X86_64_TLSGD", Const, 0, ""},
  3690  		{"R_X86_64_TLSLD", Const, 0, ""},
  3691  		{"R_X86_64_TPOFF32", Const, 0, ""},
  3692  		{"R_X86_64_TPOFF64", Const, 0, ""},
  3693  		{"Rel32", Type, 0, ""},
  3694  		{"Rel32.Info", Field, 0, ""},
  3695  		{"Rel32.Off", Field, 0, ""},
  3696  		{"Rel64", Type, 0, ""},
  3697  		{"Rel64.Info", Field, 0, ""},
  3698  		{"Rel64.Off", Field, 0, ""},
  3699  		{"Rela32", Type, 0, ""},
  3700  		{"Rela32.Addend", Field, 0, ""},
  3701  		{"Rela32.Info", Field, 0, ""},
  3702  		{"Rela32.Off", Field, 0, ""},
  3703  		{"Rela64", Type, 0, ""},
  3704  		{"Rela64.Addend", Field, 0, ""},
  3705  		{"Rela64.Info", Field, 0, ""},
  3706  		{"Rela64.Off", Field, 0, ""},
  3707  		{"SHF_ALLOC", Const, 0, ""},
  3708  		{"SHF_COMPRESSED", Const, 6, ""},
  3709  		{"SHF_EXECINSTR", Const, 0, ""},
  3710  		{"SHF_GROUP", Const, 0, ""},
  3711  		{"SHF_INFO_LINK", Const, 0, ""},
  3712  		{"SHF_LINK_ORDER", Const, 0, ""},
  3713  		{"SHF_MASKOS", Const, 0, ""},
  3714  		{"SHF_MASKPROC", Const, 0, ""},
  3715  		{"SHF_MERGE", Const, 0, ""},
  3716  		{"SHF_OS_NONCONFORMING", Const, 0, ""},
  3717  		{"SHF_STRINGS", Const, 0, ""},
  3718  		{"SHF_TLS", Const, 0, ""},
  3719  		{"SHF_WRITE", Const, 0, ""},
  3720  		{"SHN_ABS", Const, 0, ""},
  3721  		{"SHN_COMMON", Const, 0, ""},
  3722  		{"SHN_HIOS", Const, 0, ""},
  3723  		{"SHN_HIPROC", Const, 0, ""},
  3724  		{"SHN_HIRESERVE", Const, 0, ""},
  3725  		{"SHN_LOOS", Const, 0, ""},
  3726  		{"SHN_LOPROC", Const, 0, ""},
  3727  		{"SHN_LORESERVE", Const, 0, ""},
  3728  		{"SHN_UNDEF", Const, 0, ""},
  3729  		{"SHN_XINDEX", Const, 0, ""},
  3730  		{"SHT_DYNAMIC", Const, 0, ""},
  3731  		{"SHT_DYNSYM", Const, 0, ""},
  3732  		{"SHT_FINI_ARRAY", Const, 0, ""},
  3733  		{"SHT_GNU_ATTRIBUTES", Const, 0, ""},
  3734  		{"SHT_GNU_HASH", Const, 0, ""},
  3735  		{"SHT_GNU_LIBLIST", Const, 0, ""},
  3736  		{"SHT_GNU_VERDEF", Const, 0, ""},
  3737  		{"SHT_GNU_VERNEED", Const, 0, ""},
  3738  		{"SHT_GNU_VERSYM", Const, 0, ""},
  3739  		{"SHT_GROUP", Const, 0, ""},
  3740  		{"SHT_HASH", Const, 0, ""},
  3741  		{"SHT_HIOS", Const, 0, ""},
  3742  		{"SHT_HIPROC", Const, 0, ""},
  3743  		{"SHT_HIUSER", Const, 0, ""},
  3744  		{"SHT_INIT_ARRAY", Const, 0, ""},
  3745  		{"SHT_LOOS", Const, 0, ""},
  3746  		{"SHT_LOPROC", Const, 0, ""},
  3747  		{"SHT_LOUSER", Const, 0, ""},
  3748  		{"SHT_MIPS_ABIFLAGS", Const, 17, ""},
  3749  		{"SHT_NOBITS", Const, 0, ""},
  3750  		{"SHT_NOTE", Const, 0, ""},
  3751  		{"SHT_NULL", Const, 0, ""},
  3752  		{"SHT_PREINIT_ARRAY", Const, 0, ""},
  3753  		{"SHT_PROGBITS", Const, 0, ""},
  3754  		{"SHT_REL", Const, 0, ""},
  3755  		{"SHT_RELA", Const, 0, ""},
  3756  		{"SHT_RISCV_ATTRIBUTES", Const, 25, ""},
  3757  		{"SHT_SHLIB", Const, 0, ""},
  3758  		{"SHT_STRTAB", Const, 0, ""},
  3759  		{"SHT_SYMTAB", Const, 0, ""},
  3760  		{"SHT_SYMTAB_SHNDX", Const, 0, ""},
  3761  		{"STB_GLOBAL", Const, 0, ""},
  3762  		{"STB_HIOS", Const, 0, ""},
  3763  		{"STB_HIPROC", Const, 0, ""},
  3764  		{"STB_LOCAL", Const, 0, ""},
  3765  		{"STB_LOOS", Const, 0, ""},
  3766  		{"STB_LOPROC", Const, 0, ""},
  3767  		{"STB_WEAK", Const, 0, ""},
  3768  		{"STT_COMMON", Const, 0, ""},
  3769  		{"STT_FILE", Const, 0, ""},
  3770  		{"STT_FUNC", Const, 0, ""},
  3771  		{"STT_GNU_IFUNC", Const, 23, ""},
  3772  		{"STT_HIOS", Const, 0, ""},
  3773  		{"STT_HIPROC", Const, 0, ""},
  3774  		{"STT_LOOS", Const, 0, ""},
  3775  		{"STT_LOPROC", Const, 0, ""},
  3776  		{"STT_NOTYPE", Const, 0, ""},
  3777  		{"STT_OBJECT", Const, 0, ""},
  3778  		{"STT_RELC", Const, 23, ""},
  3779  		{"STT_SECTION", Const, 0, ""},
  3780  		{"STT_SRELC", Const, 23, ""},
  3781  		{"STT_TLS", Const, 0, ""},
  3782  		{"STV_DEFAULT", Const, 0, ""},
  3783  		{"STV_HIDDEN", Const, 0, ""},
  3784  		{"STV_INTERNAL", Const, 0, ""},
  3785  		{"STV_PROTECTED", Const, 0, ""},
  3786  		{"ST_BIND", Func, 0, "func(info uint8) SymBind"},
  3787  		{"ST_INFO", Func, 0, "func(bind SymBind, typ SymType) uint8"},
  3788  		{"ST_TYPE", Func, 0, "func(info uint8) SymType"},
  3789  		{"ST_VISIBILITY", Func, 0, "func(other uint8) SymVis"},
  3790  		{"Section", Type, 0, ""},
  3791  		{"Section.ReaderAt", Field, 0, ""},
  3792  		{"Section.SectionHeader", Field, 0, ""},
  3793  		{"Section32", Type, 0, ""},
  3794  		{"Section32.Addr", Field, 0, ""},
  3795  		{"Section32.Addralign", Field, 0, ""},
  3796  		{"Section32.Entsize", Field, 0, ""},
  3797  		{"Section32.Flags", Field, 0, ""},
  3798  		{"Section32.Info", Field, 0, ""},
  3799  		{"Section32.Link", Field, 0, ""},
  3800  		{"Section32.Name", Field, 0, ""},
  3801  		{"Section32.Off", Field, 0, ""},
  3802  		{"Section32.Size", Field, 0, ""},
  3803  		{"Section32.Type", Field, 0, ""},
  3804  		{"Section64", Type, 0, ""},
  3805  		{"Section64.Addr", Field, 0, ""},
  3806  		{"Section64.Addralign", Field, 0, ""},
  3807  		{"Section64.Entsize", Field, 0, ""},
  3808  		{"Section64.Flags", Field, 0, ""},
  3809  		{"Section64.Info", Field, 0, ""},
  3810  		{"Section64.Link", Field, 0, ""},
  3811  		{"Section64.Name", Field, 0, ""},
  3812  		{"Section64.Off", Field, 0, ""},
  3813  		{"Section64.Size", Field, 0, ""},
  3814  		{"Section64.Type", Field, 0, ""},
  3815  		{"SectionFlag", Type, 0, ""},
  3816  		{"SectionHeader", Type, 0, ""},
  3817  		{"SectionHeader.Addr", Field, 0, ""},
  3818  		{"SectionHeader.Addralign", Field, 0, ""},
  3819  		{"SectionHeader.Entsize", Field, 0, ""},
  3820  		{"SectionHeader.FileSize", Field, 6, ""},
  3821  		{"SectionHeader.Flags", Field, 0, ""},
  3822  		{"SectionHeader.Info", Field, 0, ""},
  3823  		{"SectionHeader.Link", Field, 0, ""},
  3824  		{"SectionHeader.Name", Field, 0, ""},
  3825  		{"SectionHeader.Offset", Field, 0, ""},
  3826  		{"SectionHeader.Size", Field, 0, ""},
  3827  		{"SectionHeader.Type", Field, 0, ""},
  3828  		{"SectionIndex", Type, 0, ""},
  3829  		{"SectionType", Type, 0, ""},
  3830  		{"Sym32", Type, 0, ""},
  3831  		{"Sym32.Info", Field, 0, ""},
  3832  		{"Sym32.Name", Field, 0, ""},
  3833  		{"Sym32.Other", Field, 0, ""},
  3834  		{"Sym32.Shndx", Field, 0, ""},
  3835  		{"Sym32.Size", Field, 0, ""},
  3836  		{"Sym32.Value", Field, 0, ""},
  3837  		{"Sym32Size", Const, 0, ""},
  3838  		{"Sym64", Type, 0, ""},
  3839  		{"Sym64.Info", Field, 0, ""},
  3840  		{"Sym64.Name", Field, 0, ""},
  3841  		{"Sym64.Other", Field, 0, ""},
  3842  		{"Sym64.Shndx", Field, 0, ""},
  3843  		{"Sym64.Size", Field, 0, ""},
  3844  		{"Sym64.Value", Field, 0, ""},
  3845  		{"Sym64Size", Const, 0, ""},
  3846  		{"SymBind", Type, 0, ""},
  3847  		{"SymType", Type, 0, ""},
  3848  		{"SymVis", Type, 0, ""},
  3849  		{"Symbol", Type, 0, ""},
  3850  		{"Symbol.HasVersion", Field, 24, ""},
  3851  		{"Symbol.Info", Field, 0, ""},
  3852  		{"Symbol.Library", Field, 13, ""},
  3853  		{"Symbol.Name", Field, 0, ""},
  3854  		{"Symbol.Other", Field, 0, ""},
  3855  		{"Symbol.Section", Field, 0, ""},
  3856  		{"Symbol.Size", Field, 0, ""},
  3857  		{"Symbol.Value", Field, 0, ""},
  3858  		{"Symbol.Version", Field, 13, ""},
  3859  		{"Symbol.VersionIndex", Field, 24, ""},
  3860  		{"Type", Type, 0, ""},
  3861  		{"VER_FLG_BASE", Const, 24, ""},
  3862  		{"VER_FLG_INFO", Const, 24, ""},
  3863  		{"VER_FLG_WEAK", Const, 24, ""},
  3864  		{"Version", Type, 0, ""},
  3865  		{"VersionIndex", Type, 24, ""},
  3866  	},
  3867  	"debug/gosym": {
  3868  		{"(*DecodingError).Error", Method, 0, ""},
  3869  		{"(*LineTable).LineToPC", Method, 0, ""},
  3870  		{"(*LineTable).PCToLine", Method, 0, ""},
  3871  		{"(*Sym).BaseName", Method, 0, ""},
  3872  		{"(*Sym).PackageName", Method, 0, ""},
  3873  		{"(*Sym).ReceiverName", Method, 0, ""},
  3874  		{"(*Sym).Static", Method, 0, ""},
  3875  		{"(*Table).LineToPC", Method, 0, ""},
  3876  		{"(*Table).LookupFunc", Method, 0, ""},
  3877  		{"(*Table).LookupSym", Method, 0, ""},
  3878  		{"(*Table).PCToFunc", Method, 0, ""},
  3879  		{"(*Table).PCToLine", Method, 0, ""},
  3880  		{"(*Table).SymByAddr", Method, 0, ""},
  3881  		{"(*UnknownLineError).Error", Method, 0, ""},
  3882  		{"(Func).BaseName", Method, 0, ""},
  3883  		{"(Func).PackageName", Method, 0, ""},
  3884  		{"(Func).ReceiverName", Method, 0, ""},
  3885  		{"(Func).Static", Method, 0, ""},
  3886  		{"(UnknownFileError).Error", Method, 0, ""},
  3887  		{"DecodingError", Type, 0, ""},
  3888  		{"Func", Type, 0, ""},
  3889  		{"Func.End", Field, 0, ""},
  3890  		{"Func.Entry", Field, 0, ""},
  3891  		{"Func.FrameSize", Field, 0, ""},
  3892  		{"Func.LineTable", Field, 0, ""},
  3893  		{"Func.Locals", Field, 0, ""},
  3894  		{"Func.Obj", Field, 0, ""},
  3895  		{"Func.Params", Field, 0, ""},
  3896  		{"Func.Sym", Field, 0, ""},
  3897  		{"LineTable", Type, 0, ""},
  3898  		{"LineTable.Data", Field, 0, ""},
  3899  		{"LineTable.Line", Field, 0, ""},
  3900  		{"LineTable.PC", Field, 0, ""},
  3901  		{"NewLineTable", Func, 0, "func(data []byte, text uint64) *LineTable"},
  3902  		{"NewTable", Func, 0, "func(symtab []byte, pcln *LineTable) (*Table, error)"},
  3903  		{"Obj", Type, 0, ""},
  3904  		{"Obj.Funcs", Field, 0, ""},
  3905  		{"Obj.Paths", Field, 0, ""},
  3906  		{"Sym", Type, 0, ""},
  3907  		{"Sym.Func", Field, 0, ""},
  3908  		{"Sym.GoType", Field, 0, ""},
  3909  		{"Sym.Name", Field, 0, ""},
  3910  		{"Sym.Type", Field, 0, ""},
  3911  		{"Sym.Value", Field, 0, ""},
  3912  		{"Table", Type, 0, ""},
  3913  		{"Table.Files", Field, 0, ""},
  3914  		{"Table.Funcs", Field, 0, ""},
  3915  		{"Table.Objs", Field, 0, ""},
  3916  		{"Table.Syms", Field, 0, ""},
  3917  		{"UnknownFileError", Type, 0, ""},
  3918  		{"UnknownLineError", Type, 0, ""},
  3919  		{"UnknownLineError.File", Field, 0, ""},
  3920  		{"UnknownLineError.Line", Field, 0, ""},
  3921  	},
  3922  	"debug/macho": {
  3923  		{"(*FatFile).Close", Method, 3, ""},
  3924  		{"(*File).Close", Method, 0, ""},
  3925  		{"(*File).DWARF", Method, 0, ""},
  3926  		{"(*File).ImportedLibraries", Method, 0, ""},
  3927  		{"(*File).ImportedSymbols", Method, 0, ""},
  3928  		{"(*File).Section", Method, 0, ""},
  3929  		{"(*File).Segment", Method, 0, ""},
  3930  		{"(*FormatError).Error", Method, 0, ""},
  3931  		{"(*Section).Data", Method, 0, ""},
  3932  		{"(*Section).Open", Method, 0, ""},
  3933  		{"(*Segment).Data", Method, 0, ""},
  3934  		{"(*Segment).Open", Method, 0, ""},
  3935  		{"(Cpu).GoString", Method, 0, ""},
  3936  		{"(Cpu).String", Method, 0, ""},
  3937  		{"(Dylib).Raw", Method, 0, ""},
  3938  		{"(Dysymtab).Raw", Method, 0, ""},
  3939  		{"(FatArch).Close", Method, 3, ""},
  3940  		{"(FatArch).DWARF", Method, 3, ""},
  3941  		{"(FatArch).ImportedLibraries", Method, 3, ""},
  3942  		{"(FatArch).ImportedSymbols", Method, 3, ""},
  3943  		{"(FatArch).Section", Method, 3, ""},
  3944  		{"(FatArch).Segment", Method, 3, ""},
  3945  		{"(LoadBytes).Raw", Method, 0, ""},
  3946  		{"(LoadCmd).GoString", Method, 0, ""},
  3947  		{"(LoadCmd).String", Method, 0, ""},
  3948  		{"(RelocTypeARM).GoString", Method, 10, ""},
  3949  		{"(RelocTypeARM).String", Method, 10, ""},
  3950  		{"(RelocTypeARM64).GoString", Method, 10, ""},
  3951  		{"(RelocTypeARM64).String", Method, 10, ""},
  3952  		{"(RelocTypeGeneric).GoString", Method, 10, ""},
  3953  		{"(RelocTypeGeneric).String", Method, 10, ""},
  3954  		{"(RelocTypeX86_64).GoString", Method, 10, ""},
  3955  		{"(RelocTypeX86_64).String", Method, 10, ""},
  3956  		{"(Rpath).Raw", Method, 10, ""},
  3957  		{"(Section).ReadAt", Method, 0, ""},
  3958  		{"(Segment).Raw", Method, 0, ""},
  3959  		{"(Segment).ReadAt", Method, 0, ""},
  3960  		{"(Symtab).Raw", Method, 0, ""},
  3961  		{"(Type).GoString", Method, 10, ""},
  3962  		{"(Type).String", Method, 10, ""},
  3963  		{"ARM64_RELOC_ADDEND", Const, 10, ""},
  3964  		{"ARM64_RELOC_BRANCH26", Const, 10, ""},
  3965  		{"ARM64_RELOC_GOT_LOAD_PAGE21", Const, 10, ""},
  3966  		{"ARM64_RELOC_GOT_LOAD_PAGEOFF12", Const, 10, ""},
  3967  		{"ARM64_RELOC_PAGE21", Const, 10, ""},
  3968  		{"ARM64_RELOC_PAGEOFF12", Const, 10, ""},
  3969  		{"ARM64_RELOC_POINTER_TO_GOT", Const, 10, ""},
  3970  		{"ARM64_RELOC_SUBTRACTOR", Const, 10, ""},
  3971  		{"ARM64_RELOC_TLVP_LOAD_PAGE21", Const, 10, ""},
  3972  		{"ARM64_RELOC_TLVP_LOAD_PAGEOFF12", Const, 10, ""},
  3973  		{"ARM64_RELOC_UNSIGNED", Const, 10, ""},
  3974  		{"ARM_RELOC_BR24", Const, 10, ""},
  3975  		{"ARM_RELOC_HALF", Const, 10, ""},
  3976  		{"ARM_RELOC_HALF_SECTDIFF", Const, 10, ""},
  3977  		{"ARM_RELOC_LOCAL_SECTDIFF", Const, 10, ""},
  3978  		{"ARM_RELOC_PAIR", Const, 10, ""},
  3979  		{"ARM_RELOC_PB_LA_PTR", Const, 10, ""},
  3980  		{"ARM_RELOC_SECTDIFF", Const, 10, ""},
  3981  		{"ARM_RELOC_VANILLA", Const, 10, ""},
  3982  		{"ARM_THUMB_32BIT_BRANCH", Const, 10, ""},
  3983  		{"ARM_THUMB_RELOC_BR22", Const, 10, ""},
  3984  		{"Cpu", Type, 0, ""},
  3985  		{"Cpu386", Const, 0, ""},
  3986  		{"CpuAmd64", Const, 0, ""},
  3987  		{"CpuArm", Const, 3, ""},
  3988  		{"CpuArm64", Const, 11, ""},
  3989  		{"CpuPpc", Const, 3, ""},
  3990  		{"CpuPpc64", Const, 3, ""},
  3991  		{"Dylib", Type, 0, ""},
  3992  		{"Dylib.CompatVersion", Field, 0, ""},
  3993  		{"Dylib.CurrentVersion", Field, 0, ""},
  3994  		{"Dylib.LoadBytes", Field, 0, ""},
  3995  		{"Dylib.Name", Field, 0, ""},
  3996  		{"Dylib.Time", Field, 0, ""},
  3997  		{"DylibCmd", Type, 0, ""},
  3998  		{"DylibCmd.Cmd", Field, 0, ""},
  3999  		{"DylibCmd.CompatVersion", Field, 0, ""},
  4000  		{"DylibCmd.CurrentVersion", Field, 0, ""},
  4001  		{"DylibCmd.Len", Field, 0, ""},
  4002  		{"DylibCmd.Name", Field, 0, ""},
  4003  		{"DylibCmd.Time", Field, 0, ""},
  4004  		{"Dysymtab", Type, 0, ""},
  4005  		{"Dysymtab.DysymtabCmd", Field, 0, ""},
  4006  		{"Dysymtab.IndirectSyms", Field, 0, ""},
  4007  		{"Dysymtab.LoadBytes", Field, 0, ""},
  4008  		{"DysymtabCmd", Type, 0, ""},
  4009  		{"DysymtabCmd.Cmd", Field, 0, ""},
  4010  		{"DysymtabCmd.Extrefsymoff", Field, 0, ""},
  4011  		{"DysymtabCmd.Extreloff", Field, 0, ""},
  4012  		{"DysymtabCmd.Iextdefsym", Field, 0, ""},
  4013  		{"DysymtabCmd.Ilocalsym", Field, 0, ""},
  4014  		{"DysymtabCmd.Indirectsymoff", Field, 0, ""},
  4015  		{"DysymtabCmd.Iundefsym", Field, 0, ""},
  4016  		{"DysymtabCmd.Len", Field, 0, ""},
  4017  		{"DysymtabCmd.Locreloff", Field, 0, ""},
  4018  		{"DysymtabCmd.Modtaboff", Field, 0, ""},
  4019  		{"DysymtabCmd.Nextdefsym", Field, 0, ""},
  4020  		{"DysymtabCmd.Nextrefsyms", Field, 0, ""},
  4021  		{"DysymtabCmd.Nextrel", Field, 0, ""},
  4022  		{"DysymtabCmd.Nindirectsyms", Field, 0, ""},
  4023  		{"DysymtabCmd.Nlocalsym", Field, 0, ""},
  4024  		{"DysymtabCmd.Nlocrel", Field, 0, ""},
  4025  		{"DysymtabCmd.Nmodtab", Field, 0, ""},
  4026  		{"DysymtabCmd.Ntoc", Field, 0, ""},
  4027  		{"DysymtabCmd.Nundefsym", Field, 0, ""},
  4028  		{"DysymtabCmd.Tocoffset", Field, 0, ""},
  4029  		{"ErrNotFat", Var, 3, ""},
  4030  		{"FatArch", Type, 3, ""},
  4031  		{"FatArch.FatArchHeader", Field, 3, ""},
  4032  		{"FatArch.File", Field, 3, ""},
  4033  		{"FatArchHeader", Type, 3, ""},
  4034  		{"FatArchHeader.Align", Field, 3, ""},
  4035  		{"FatArchHeader.Cpu", Field, 3, ""},
  4036  		{"FatArchHeader.Offset", Field, 3, ""},
  4037  		{"FatArchHeader.Size", Field, 3, ""},
  4038  		{"FatArchHeader.SubCpu", Field, 3, ""},
  4039  		{"FatFile", Type, 3, ""},
  4040  		{"FatFile.Arches", Field, 3, ""},
  4041  		{"FatFile.Magic", Field, 3, ""},
  4042  		{"File", Type, 0, ""},
  4043  		{"File.ByteOrder", Field, 0, ""},
  4044  		{"File.Dysymtab", Field, 0, ""},
  4045  		{"File.FileHeader", Field, 0, ""},
  4046  		{"File.Loads", Field, 0, ""},
  4047  		{"File.Sections", Field, 0, ""},
  4048  		{"File.Symtab", Field, 0, ""},
  4049  		{"FileHeader", Type, 0, ""},
  4050  		{"FileHeader.Cmdsz", Field, 0, ""},
  4051  		{"FileHeader.Cpu", Field, 0, ""},
  4052  		{"FileHeader.Flags", Field, 0, ""},
  4053  		{"FileHeader.Magic", Field, 0, ""},
  4054  		{"FileHeader.Ncmd", Field, 0, ""},
  4055  		{"FileHeader.SubCpu", Field, 0, ""},
  4056  		{"FileHeader.Type", Field, 0, ""},
  4057  		{"FlagAllModsBound", Const, 10, ""},
  4058  		{"FlagAllowStackExecution", Const, 10, ""},
  4059  		{"FlagAppExtensionSafe", Const, 10, ""},
  4060  		{"FlagBindAtLoad", Const, 10, ""},
  4061  		{"FlagBindsToWeak", Const, 10, ""},
  4062  		{"FlagCanonical", Const, 10, ""},
  4063  		{"FlagDeadStrippableDylib", Const, 10, ""},
  4064  		{"FlagDyldLink", Const, 10, ""},
  4065  		{"FlagForceFlat", Const, 10, ""},
  4066  		{"FlagHasTLVDescriptors", Const, 10, ""},
  4067  		{"FlagIncrLink", Const, 10, ""},
  4068  		{"FlagLazyInit", Const, 10, ""},
  4069  		{"FlagNoFixPrebinding", Const, 10, ""},
  4070  		{"FlagNoHeapExecution", Const, 10, ""},
  4071  		{"FlagNoMultiDefs", Const, 10, ""},
  4072  		{"FlagNoReexportedDylibs", Const, 10, ""},
  4073  		{"FlagNoUndefs", Const, 10, ""},
  4074  		{"FlagPIE", Const, 10, ""},
  4075  		{"FlagPrebindable", Const, 10, ""},
  4076  		{"FlagPrebound", Const, 10, ""},
  4077  		{"FlagRootSafe", Const, 10, ""},
  4078  		{"FlagSetuidSafe", Const, 10, ""},
  4079  		{"FlagSplitSegs", Const, 10, ""},
  4080  		{"FlagSubsectionsViaSymbols", Const, 10, ""},
  4081  		{"FlagTwoLevel", Const, 10, ""},
  4082  		{"FlagWeakDefines", Const, 10, ""},
  4083  		{"FormatError", Type, 0, ""},
  4084  		{"GENERIC_RELOC_LOCAL_SECTDIFF", Const, 10, ""},
  4085  		{"GENERIC_RELOC_PAIR", Const, 10, ""},
  4086  		{"GENERIC_RELOC_PB_LA_PTR", Const, 10, ""},
  4087  		{"GENERIC_RELOC_SECTDIFF", Const, 10, ""},
  4088  		{"GENERIC_RELOC_TLV", Const, 10, ""},
  4089  		{"GENERIC_RELOC_VANILLA", Const, 10, ""},
  4090  		{"Load", Type, 0, ""},
  4091  		{"LoadBytes", Type, 0, ""},
  4092  		{"LoadCmd", Type, 0, ""},
  4093  		{"LoadCmdDylib", Const, 0, ""},
  4094  		{"LoadCmdDylinker", Const, 0, ""},
  4095  		{"LoadCmdDysymtab", Const, 0, ""},
  4096  		{"LoadCmdRpath", Const, 10, ""},
  4097  		{"LoadCmdSegment", Const, 0, ""},
  4098  		{"LoadCmdSegment64", Const, 0, ""},
  4099  		{"LoadCmdSymtab", Const, 0, ""},
  4100  		{"LoadCmdThread", Const, 0, ""},
  4101  		{"LoadCmdUnixThread", Const, 0, ""},
  4102  		{"Magic32", Const, 0, ""},
  4103  		{"Magic64", Const, 0, ""},
  4104  		{"MagicFat", Const, 3, ""},
  4105  		{"NewFatFile", Func, 3, "func(r io.ReaderAt) (*FatFile, error)"},
  4106  		{"NewFile", Func, 0, "func(r io.ReaderAt) (*File, error)"},
  4107  		{"Nlist32", Type, 0, ""},
  4108  		{"Nlist32.Desc", Field, 0, ""},
  4109  		{"Nlist32.Name", Field, 0, ""},
  4110  		{"Nlist32.Sect", Field, 0, ""},
  4111  		{"Nlist32.Type", Field, 0, ""},
  4112  		{"Nlist32.Value", Field, 0, ""},
  4113  		{"Nlist64", Type, 0, ""},
  4114  		{"Nlist64.Desc", Field, 0, ""},
  4115  		{"Nlist64.Name", Field, 0, ""},
  4116  		{"Nlist64.Sect", Field, 0, ""},
  4117  		{"Nlist64.Type", Field, 0, ""},
  4118  		{"Nlist64.Value", Field, 0, ""},
  4119  		{"Open", Func, 0, "func(name string) (*File, error)"},
  4120  		{"OpenFat", Func, 3, "func(name string) (*FatFile, error)"},
  4121  		{"Regs386", Type, 0, ""},
  4122  		{"Regs386.AX", Field, 0, ""},
  4123  		{"Regs386.BP", Field, 0, ""},
  4124  		{"Regs386.BX", Field, 0, ""},
  4125  		{"Regs386.CS", Field, 0, ""},
  4126  		{"Regs386.CX", Field, 0, ""},
  4127  		{"Regs386.DI", Field, 0, ""},
  4128  		{"Regs386.DS", Field, 0, ""},
  4129  		{"Regs386.DX", Field, 0, ""},
  4130  		{"Regs386.ES", Field, 0, ""},
  4131  		{"Regs386.FLAGS", Field, 0, ""},
  4132  		{"Regs386.FS", Field, 0, ""},
  4133  		{"Regs386.GS", Field, 0, ""},
  4134  		{"Regs386.IP", Field, 0, ""},
  4135  		{"Regs386.SI", Field, 0, ""},
  4136  		{"Regs386.SP", Field, 0, ""},
  4137  		{"Regs386.SS", Field, 0, ""},
  4138  		{"RegsAMD64", Type, 0, ""},
  4139  		{"RegsAMD64.AX", Field, 0, ""},
  4140  		{"RegsAMD64.BP", Field, 0, ""},
  4141  		{"RegsAMD64.BX", Field, 0, ""},
  4142  		{"RegsAMD64.CS", Field, 0, ""},
  4143  		{"RegsAMD64.CX", Field, 0, ""},
  4144  		{"RegsAMD64.DI", Field, 0, ""},
  4145  		{"RegsAMD64.DX", Field, 0, ""},
  4146  		{"RegsAMD64.FLAGS", Field, 0, ""},
  4147  		{"RegsAMD64.FS", Field, 0, ""},
  4148  		{"RegsAMD64.GS", Field, 0, ""},
  4149  		{"RegsAMD64.IP", Field, 0, ""},
  4150  		{"RegsAMD64.R10", Field, 0, ""},
  4151  		{"RegsAMD64.R11", Field, 0, ""},
  4152  		{"RegsAMD64.R12", Field, 0, ""},
  4153  		{"RegsAMD64.R13", Field, 0, ""},
  4154  		{"RegsAMD64.R14", Field, 0, ""},
  4155  		{"RegsAMD64.R15", Field, 0, ""},
  4156  		{"RegsAMD64.R8", Field, 0, ""},
  4157  		{"RegsAMD64.R9", Field, 0, ""},
  4158  		{"RegsAMD64.SI", Field, 0, ""},
  4159  		{"RegsAMD64.SP", Field, 0, ""},
  4160  		{"Reloc", Type, 10, ""},
  4161  		{"Reloc.Addr", Field, 10, ""},
  4162  		{"Reloc.Extern", Field, 10, ""},
  4163  		{"Reloc.Len", Field, 10, ""},
  4164  		{"Reloc.Pcrel", Field, 10, ""},
  4165  		{"Reloc.Scattered", Field, 10, ""},
  4166  		{"Reloc.Type", Field, 10, ""},
  4167  		{"Reloc.Value", Field, 10, ""},
  4168  		{"RelocTypeARM", Type, 10, ""},
  4169  		{"RelocTypeARM64", Type, 10, ""},
  4170  		{"RelocTypeGeneric", Type, 10, ""},
  4171  		{"RelocTypeX86_64", Type, 10, ""},
  4172  		{"Rpath", Type, 10, ""},
  4173  		{"Rpath.LoadBytes", Field, 10, ""},
  4174  		{"Rpath.Path", Field, 10, ""},
  4175  		{"RpathCmd", Type, 10, ""},
  4176  		{"RpathCmd.Cmd", Field, 10, ""},
  4177  		{"RpathCmd.Len", Field, 10, ""},
  4178  		{"RpathCmd.Path", Field, 10, ""},
  4179  		{"Section", Type, 0, ""},
  4180  		{"Section.ReaderAt", Field, 0, ""},
  4181  		{"Section.Relocs", Field, 10, ""},
  4182  		{"Section.SectionHeader", Field, 0, ""},
  4183  		{"Section32", Type, 0, ""},
  4184  		{"Section32.Addr", Field, 0, ""},
  4185  		{"Section32.Align", Field, 0, ""},
  4186  		{"Section32.Flags", Field, 0, ""},
  4187  		{"Section32.Name", Field, 0, ""},
  4188  		{"Section32.Nreloc", Field, 0, ""},
  4189  		{"Section32.Offset", Field, 0, ""},
  4190  		{"Section32.Reloff", Field, 0, ""},
  4191  		{"Section32.Reserve1", Field, 0, ""},
  4192  		{"Section32.Reserve2", Field, 0, ""},
  4193  		{"Section32.Seg", Field, 0, ""},
  4194  		{"Section32.Size", Field, 0, ""},
  4195  		{"Section64", Type, 0, ""},
  4196  		{"Section64.Addr", Field, 0, ""},
  4197  		{"Section64.Align", Field, 0, ""},
  4198  		{"Section64.Flags", Field, 0, ""},
  4199  		{"Section64.Name", Field, 0, ""},
  4200  		{"Section64.Nreloc", Field, 0, ""},
  4201  		{"Section64.Offset", Field, 0, ""},
  4202  		{"Section64.Reloff", Field, 0, ""},
  4203  		{"Section64.Reserve1", Field, 0, ""},
  4204  		{"Section64.Reserve2", Field, 0, ""},
  4205  		{"Section64.Reserve3", Field, 0, ""},
  4206  		{"Section64.Seg", Field, 0, ""},
  4207  		{"Section64.Size", Field, 0, ""},
  4208  		{"SectionHeader", Type, 0, ""},
  4209  		{"SectionHeader.Addr", Field, 0, ""},
  4210  		{"SectionHeader.Align", Field, 0, ""},
  4211  		{"SectionHeader.Flags", Field, 0, ""},
  4212  		{"SectionHeader.Name", Field, 0, ""},
  4213  		{"SectionHeader.Nreloc", Field, 0, ""},
  4214  		{"SectionHeader.Offset", Field, 0, ""},
  4215  		{"SectionHeader.Reloff", Field, 0, ""},
  4216  		{"SectionHeader.Seg", Field, 0, ""},
  4217  		{"SectionHeader.Size", Field, 0, ""},
  4218  		{"Segment", Type, 0, ""},
  4219  		{"Segment.LoadBytes", Field, 0, ""},
  4220  		{"Segment.ReaderAt", Field, 0, ""},
  4221  		{"Segment.SegmentHeader", Field, 0, ""},
  4222  		{"Segment32", Type, 0, ""},
  4223  		{"Segment32.Addr", Field, 0, ""},
  4224  		{"Segment32.Cmd", Field, 0, ""},
  4225  		{"Segment32.Filesz", Field, 0, ""},
  4226  		{"Segment32.Flag", Field, 0, ""},
  4227  		{"Segment32.Len", Field, 0, ""},
  4228  		{"Segment32.Maxprot", Field, 0, ""},
  4229  		{"Segment32.Memsz", Field, 0, ""},
  4230  		{"Segment32.Name", Field, 0, ""},
  4231  		{"Segment32.Nsect", Field, 0, ""},
  4232  		{"Segment32.Offset", Field, 0, ""},
  4233  		{"Segment32.Prot", Field, 0, ""},
  4234  		{"Segment64", Type, 0, ""},
  4235  		{"Segment64.Addr", Field, 0, ""},
  4236  		{"Segment64.Cmd", Field, 0, ""},
  4237  		{"Segment64.Filesz", Field, 0, ""},
  4238  		{"Segment64.Flag", Field, 0, ""},
  4239  		{"Segment64.Len", Field, 0, ""},
  4240  		{"Segment64.Maxprot", Field, 0, ""},
  4241  		{"Segment64.Memsz", Field, 0, ""},
  4242  		{"Segment64.Name", Field, 0, ""},
  4243  		{"Segment64.Nsect", Field, 0, ""},
  4244  		{"Segment64.Offset", Field, 0, ""},
  4245  		{"Segment64.Prot", Field, 0, ""},
  4246  		{"SegmentHeader", Type, 0, ""},
  4247  		{"SegmentHeader.Addr", Field, 0, ""},
  4248  		{"SegmentHeader.Cmd", Field, 0, ""},
  4249  		{"SegmentHeader.Filesz", Field, 0, ""},
  4250  		{"SegmentHeader.Flag", Field, 0, ""},
  4251  		{"SegmentHeader.Len", Field, 0, ""},
  4252  		{"SegmentHeader.Maxprot", Field, 0, ""},
  4253  		{"SegmentHeader.Memsz", Field, 0, ""},
  4254  		{"SegmentHeader.Name", Field, 0, ""},
  4255  		{"SegmentHeader.Nsect", Field, 0, ""},
  4256  		{"SegmentHeader.Offset", Field, 0, ""},
  4257  		{"SegmentHeader.Prot", Field, 0, ""},
  4258  		{"Symbol", Type, 0, ""},
  4259  		{"Symbol.Desc", Field, 0, ""},
  4260  		{"Symbol.Name", Field, 0, ""},
  4261  		{"Symbol.Sect", Field, 0, ""},
  4262  		{"Symbol.Type", Field, 0, ""},
  4263  		{"Symbol.Value", Field, 0, ""},
  4264  		{"Symtab", Type, 0, ""},
  4265  		{"Symtab.LoadBytes", Field, 0, ""},
  4266  		{"Symtab.Syms", Field, 0, ""},
  4267  		{"Symtab.SymtabCmd", Field, 0, ""},
  4268  		{"SymtabCmd", Type, 0, ""},
  4269  		{"SymtabCmd.Cmd", Field, 0, ""},
  4270  		{"SymtabCmd.Len", Field, 0, ""},
  4271  		{"SymtabCmd.Nsyms", Field, 0, ""},
  4272  		{"SymtabCmd.Stroff", Field, 0, ""},
  4273  		{"SymtabCmd.Strsize", Field, 0, ""},
  4274  		{"SymtabCmd.Symoff", Field, 0, ""},
  4275  		{"Thread", Type, 0, ""},
  4276  		{"Thread.Cmd", Field, 0, ""},
  4277  		{"Thread.Data", Field, 0, ""},
  4278  		{"Thread.Len", Field, 0, ""},
  4279  		{"Thread.Type", Field, 0, ""},
  4280  		{"Type", Type, 0, ""},
  4281  		{"TypeBundle", Const, 3, ""},
  4282  		{"TypeDylib", Const, 3, ""},
  4283  		{"TypeExec", Const, 0, ""},
  4284  		{"TypeObj", Const, 0, ""},
  4285  		{"X86_64_RELOC_BRANCH", Const, 10, ""},
  4286  		{"X86_64_RELOC_GOT", Const, 10, ""},
  4287  		{"X86_64_RELOC_GOT_LOAD", Const, 10, ""},
  4288  		{"X86_64_RELOC_SIGNED", Const, 10, ""},
  4289  		{"X86_64_RELOC_SIGNED_1", Const, 10, ""},
  4290  		{"X86_64_RELOC_SIGNED_2", Const, 10, ""},
  4291  		{"X86_64_RELOC_SIGNED_4", Const, 10, ""},
  4292  		{"X86_64_RELOC_SUBTRACTOR", Const, 10, ""},
  4293  		{"X86_64_RELOC_TLV", Const, 10, ""},
  4294  		{"X86_64_RELOC_UNSIGNED", Const, 10, ""},
  4295  	},
  4296  	"debug/pe": {
  4297  		{"(*COFFSymbol).FullName", Method, 8, ""},
  4298  		{"(*File).COFFSymbolReadSectionDefAux", Method, 19, ""},
  4299  		{"(*File).Close", Method, 0, ""},
  4300  		{"(*File).DWARF", Method, 0, ""},
  4301  		{"(*File).ImportedLibraries", Method, 0, ""},
  4302  		{"(*File).ImportedSymbols", Method, 0, ""},
  4303  		{"(*File).Section", Method, 0, ""},
  4304  		{"(*FormatError).Error", Method, 0, ""},
  4305  		{"(*Section).Data", Method, 0, ""},
  4306  		{"(*Section).Open", Method, 0, ""},
  4307  		{"(Section).ReadAt", Method, 0, ""},
  4308  		{"(StringTable).String", Method, 8, ""},
  4309  		{"COFFSymbol", Type, 1, ""},
  4310  		{"COFFSymbol.Name", Field, 1, ""},
  4311  		{"COFFSymbol.NumberOfAuxSymbols", Field, 1, ""},
  4312  		{"COFFSymbol.SectionNumber", Field, 1, ""},
  4313  		{"COFFSymbol.StorageClass", Field, 1, ""},
  4314  		{"COFFSymbol.Type", Field, 1, ""},
  4315  		{"COFFSymbol.Value", Field, 1, ""},
  4316  		{"COFFSymbolAuxFormat5", Type, 19, ""},
  4317  		{"COFFSymbolAuxFormat5.Checksum", Field, 19, ""},
  4318  		{"COFFSymbolAuxFormat5.NumLineNumbers", Field, 19, ""},
  4319  		{"COFFSymbolAuxFormat5.NumRelocs", Field, 19, ""},
  4320  		{"COFFSymbolAuxFormat5.SecNum", Field, 19, ""},
  4321  		{"COFFSymbolAuxFormat5.Selection", Field, 19, ""},
  4322  		{"COFFSymbolAuxFormat5.Size", Field, 19, ""},
  4323  		{"COFFSymbolSize", Const, 1, ""},
  4324  		{"DataDirectory", Type, 3, ""},
  4325  		{"DataDirectory.Size", Field, 3, ""},
  4326  		{"DataDirectory.VirtualAddress", Field, 3, ""},
  4327  		{"File", Type, 0, ""},
  4328  		{"File.COFFSymbols", Field, 8, ""},
  4329  		{"File.FileHeader", Field, 0, ""},
  4330  		{"File.OptionalHeader", Field, 3, ""},
  4331  		{"File.Sections", Field, 0, ""},
  4332  		{"File.StringTable", Field, 8, ""},
  4333  		{"File.Symbols", Field, 1, ""},
  4334  		{"FileHeader", Type, 0, ""},
  4335  		{"FileHeader.Characteristics", Field, 0, ""},
  4336  		{"FileHeader.Machine", Field, 0, ""},
  4337  		{"FileHeader.NumberOfSections", Field, 0, ""},
  4338  		{"FileHeader.NumberOfSymbols", Field, 0, ""},
  4339  		{"FileHeader.PointerToSymbolTable", Field, 0, ""},
  4340  		{"FileHeader.SizeOfOptionalHeader", Field, 0, ""},
  4341  		{"FileHeader.TimeDateStamp", Field, 0, ""},
  4342  		{"FormatError", Type, 0, ""},
  4343  		{"IMAGE_COMDAT_SELECT_ANY", Const, 19, ""},
  4344  		{"IMAGE_COMDAT_SELECT_ASSOCIATIVE", Const, 19, ""},
  4345  		{"IMAGE_COMDAT_SELECT_EXACT_MATCH", Const, 19, ""},
  4346  		{"IMAGE_COMDAT_SELECT_LARGEST", Const, 19, ""},
  4347  		{"IMAGE_COMDAT_SELECT_NODUPLICATES", Const, 19, ""},
  4348  		{"IMAGE_COMDAT_SELECT_SAME_SIZE", Const, 19, ""},
  4349  		{"IMAGE_DIRECTORY_ENTRY_ARCHITECTURE", Const, 11, ""},
  4350  		{"IMAGE_DIRECTORY_ENTRY_BASERELOC", Const, 11, ""},
  4351  		{"IMAGE_DIRECTORY_ENTRY_BOUND_IMPORT", Const, 11, ""},
  4352  		{"IMAGE_DIRECTORY_ENTRY_COM_DESCRIPTOR", Const, 11, ""},
  4353  		{"IMAGE_DIRECTORY_ENTRY_DEBUG", Const, 11, ""},
  4354  		{"IMAGE_DIRECTORY_ENTRY_DELAY_IMPORT", Const, 11, ""},
  4355  		{"IMAGE_DIRECTORY_ENTRY_EXCEPTION", Const, 11, ""},
  4356  		{"IMAGE_DIRECTORY_ENTRY_EXPORT", Const, 11, ""},
  4357  		{"IMAGE_DIRECTORY_ENTRY_GLOBALPTR", Const, 11, ""},
  4358  		{"IMAGE_DIRECTORY_ENTRY_IAT", Const, 11, ""},
  4359  		{"IMAGE_DIRECTORY_ENTRY_IMPORT", Const, 11, ""},
  4360  		{"IMAGE_DIRECTORY_ENTRY_LOAD_CONFIG", Const, 11, ""},
  4361  		{"IMAGE_DIRECTORY_ENTRY_RESOURCE", Const, 11, ""},
  4362  		{"IMAGE_DIRECTORY_ENTRY_SECURITY", Const, 11, ""},
  4363  		{"IMAGE_DIRECTORY_ENTRY_TLS", Const, 11, ""},
  4364  		{"IMAGE_DLLCHARACTERISTICS_APPCONTAINER", Const, 15, ""},
  4365  		{"IMAGE_DLLCHARACTERISTICS_DYNAMIC_BASE", Const, 15, ""},
  4366  		{"IMAGE_DLLCHARACTERISTICS_FORCE_INTEGRITY", Const, 15, ""},
  4367  		{"IMAGE_DLLCHARACTERISTICS_GUARD_CF", Const, 15, ""},
  4368  		{"IMAGE_DLLCHARACTERISTICS_HIGH_ENTROPY_VA", Const, 15, ""},
  4369  		{"IMAGE_DLLCHARACTERISTICS_NO_BIND", Const, 15, ""},
  4370  		{"IMAGE_DLLCHARACTERISTICS_NO_ISOLATION", Const, 15, ""},
  4371  		{"IMAGE_DLLCHARACTERISTICS_NO_SEH", Const, 15, ""},
  4372  		{"IMAGE_DLLCHARACTERISTICS_NX_COMPAT", Const, 15, ""},
  4373  		{"IMAGE_DLLCHARACTERISTICS_TERMINAL_SERVER_AWARE", Const, 15, ""},
  4374  		{"IMAGE_DLLCHARACTERISTICS_WDM_DRIVER", Const, 15, ""},
  4375  		{"IMAGE_FILE_32BIT_MACHINE", Const, 15, ""},
  4376  		{"IMAGE_FILE_AGGRESIVE_WS_TRIM", Const, 15, ""},
  4377  		{"IMAGE_FILE_BYTES_REVERSED_HI", Const, 15, ""},
  4378  		{"IMAGE_FILE_BYTES_REVERSED_LO", Const, 15, ""},
  4379  		{"IMAGE_FILE_DEBUG_STRIPPED", Const, 15, ""},
  4380  		{"IMAGE_FILE_DLL", Const, 15, ""},
  4381  		{"IMAGE_FILE_EXECUTABLE_IMAGE", Const, 15, ""},
  4382  		{"IMAGE_FILE_LARGE_ADDRESS_AWARE", Const, 15, ""},
  4383  		{"IMAGE_FILE_LINE_NUMS_STRIPPED", Const, 15, ""},
  4384  		{"IMAGE_FILE_LOCAL_SYMS_STRIPPED", Const, 15, ""},
  4385  		{"IMAGE_FILE_MACHINE_AM33", Const, 0, ""},
  4386  		{"IMAGE_FILE_MACHINE_AMD64", Const, 0, ""},
  4387  		{"IMAGE_FILE_MACHINE_ARM", Const, 0, ""},
  4388  		{"IMAGE_FILE_MACHINE_ARM64", Const, 11, ""},
  4389  		{"IMAGE_FILE_MACHINE_ARMNT", Const, 12, ""},
  4390  		{"IMAGE_FILE_MACHINE_EBC", Const, 0, ""},
  4391  		{"IMAGE_FILE_MACHINE_I386", Const, 0, ""},
  4392  		{"IMAGE_FILE_MACHINE_IA64", Const, 0, ""},
  4393  		{"IMAGE_FILE_MACHINE_LOONGARCH32", Const, 19, ""},
  4394  		{"IMAGE_FILE_MACHINE_LOONGARCH64", Const, 19, ""},
  4395  		{"IMAGE_FILE_MACHINE_M32R", Const, 0, ""},
  4396  		{"IMAGE_FILE_MACHINE_MIPS16", Const, 0, ""},
  4397  		{"IMAGE_FILE_MACHINE_MIPSFPU", Const, 0, ""},
  4398  		{"IMAGE_FILE_MACHINE_MIPSFPU16", Const, 0, ""},
  4399  		{"IMAGE_FILE_MACHINE_POWERPC", Const, 0, ""},
  4400  		{"IMAGE_FILE_MACHINE_POWERPCFP", Const, 0, ""},
  4401  		{"IMAGE_FILE_MACHINE_R4000", Const, 0, ""},
  4402  		{"IMAGE_FILE_MACHINE_RISCV128", Const, 20, ""},
  4403  		{"IMAGE_FILE_MACHINE_RISCV32", Const, 20, ""},
  4404  		{"IMAGE_FILE_MACHINE_RISCV64", Const, 20, ""},
  4405  		{"IMAGE_FILE_MACHINE_SH3", Const, 0, ""},
  4406  		{"IMAGE_FILE_MACHINE_SH3DSP", Const, 0, ""},
  4407  		{"IMAGE_FILE_MACHINE_SH4", Const, 0, ""},
  4408  		{"IMAGE_FILE_MACHINE_SH5", Const, 0, ""},
  4409  		{"IMAGE_FILE_MACHINE_THUMB", Const, 0, ""},
  4410  		{"IMAGE_FILE_MACHINE_UNKNOWN", Const, 0, ""},
  4411  		{"IMAGE_FILE_MACHINE_WCEMIPSV2", Const, 0, ""},
  4412  		{"IMAGE_FILE_NET_RUN_FROM_SWAP", Const, 15, ""},
  4413  		{"IMAGE_FILE_RELOCS_STRIPPED", Const, 15, ""},
  4414  		{"IMAGE_FILE_REMOVABLE_RUN_FROM_SWAP", Const, 15, ""},
  4415  		{"IMAGE_FILE_SYSTEM", Const, 15, ""},
  4416  		{"IMAGE_FILE_UP_SYSTEM_ONLY", Const, 15, ""},
  4417  		{"IMAGE_SCN_CNT_CODE", Const, 19, ""},
  4418  		{"IMAGE_SCN_CNT_INITIALIZED_DATA", Const, 19, ""},
  4419  		{"IMAGE_SCN_CNT_UNINITIALIZED_DATA", Const, 19, ""},
  4420  		{"IMAGE_SCN_LNK_COMDAT", Const, 19, ""},
  4421  		{"IMAGE_SCN_MEM_DISCARDABLE", Const, 19, ""},
  4422  		{"IMAGE_SCN_MEM_EXECUTE", Const, 19, ""},
  4423  		{"IMAGE_SCN_MEM_READ", Const, 19, ""},
  4424  		{"IMAGE_SCN_MEM_WRITE", Const, 19, ""},
  4425  		{"IMAGE_SUBSYSTEM_EFI_APPLICATION", Const, 15, ""},
  4426  		{"IMAGE_SUBSYSTEM_EFI_BOOT_SERVICE_DRIVER", Const, 15, ""},
  4427  		{"IMAGE_SUBSYSTEM_EFI_ROM", Const, 15, ""},
  4428  		{"IMAGE_SUBSYSTEM_EFI_RUNTIME_DRIVER", Const, 15, ""},
  4429  		{"IMAGE_SUBSYSTEM_NATIVE", Const, 15, ""},
  4430  		{"IMAGE_SUBSYSTEM_NATIVE_WINDOWS", Const, 15, ""},
  4431  		{"IMAGE_SUBSYSTEM_OS2_CUI", Const, 15, ""},
  4432  		{"IMAGE_SUBSYSTEM_POSIX_CUI", Const, 15, ""},
  4433  		{"IMAGE_SUBSYSTEM_UNKNOWN", Const, 15, ""},
  4434  		{"IMAGE_SUBSYSTEM_WINDOWS_BOOT_APPLICATION", Const, 15, ""},
  4435  		{"IMAGE_SUBSYSTEM_WINDOWS_CE_GUI", Const, 15, ""},
  4436  		{"IMAGE_SUBSYSTEM_WINDOWS_CUI", Const, 15, ""},
  4437  		{"IMAGE_SUBSYSTEM_WINDOWS_GUI", Const, 15, ""},
  4438  		{"IMAGE_SUBSYSTEM_XBOX", Const, 15, ""},
  4439  		{"ImportDirectory", Type, 0, ""},
  4440  		{"ImportDirectory.FirstThunk", Field, 0, ""},
  4441  		{"ImportDirectory.ForwarderChain", Field, 0, ""},
  4442  		{"ImportDirectory.Name", Field, 0, ""},
  4443  		{"ImportDirectory.OriginalFirstThunk", Field, 0, ""},
  4444  		{"ImportDirectory.TimeDateStamp", Field, 0, ""},
  4445  		{"NewFile", Func, 0, "func(r io.ReaderAt) (*File, error)"},
  4446  		{"Open", Func, 0, "func(name string) (*File, error)"},
  4447  		{"OptionalHeader32", Type, 3, ""},
  4448  		{"OptionalHeader32.AddressOfEntryPoint", Field, 3, ""},
  4449  		{"OptionalHeader32.BaseOfCode", Field, 3, ""},
  4450  		{"OptionalHeader32.BaseOfData", Field, 3, ""},
  4451  		{"OptionalHeader32.CheckSum", Field, 3, ""},
  4452  		{"OptionalHeader32.DataDirectory", Field, 3, ""},
  4453  		{"OptionalHeader32.DllCharacteristics", Field, 3, ""},
  4454  		{"OptionalHeader32.FileAlignment", Field, 3, ""},
  4455  		{"OptionalHeader32.ImageBase", Field, 3, ""},
  4456  		{"OptionalHeader32.LoaderFlags", Field, 3, ""},
  4457  		{"OptionalHeader32.Magic", Field, 3, ""},
  4458  		{"OptionalHeader32.MajorImageVersion", Field, 3, ""},
  4459  		{"OptionalHeader32.MajorLinkerVersion", Field, 3, ""},
  4460  		{"OptionalHeader32.MajorOperatingSystemVersion", Field, 3, ""},
  4461  		{"OptionalHeader32.MajorSubsystemVersion", Field, 3, ""},
  4462  		{"OptionalHeader32.MinorImageVersion", Field, 3, ""},
  4463  		{"OptionalHeader32.MinorLinkerVersion", Field, 3, ""},
  4464  		{"OptionalHeader32.MinorOperatingSystemVersion", Field, 3, ""},
  4465  		{"OptionalHeader32.MinorSubsystemVersion", Field, 3, ""},
  4466  		{"OptionalHeader32.NumberOfRvaAndSizes", Field, 3, ""},
  4467  		{"OptionalHeader32.SectionAlignment", Field, 3, ""},
  4468  		{"OptionalHeader32.SizeOfCode", Field, 3, ""},
  4469  		{"OptionalHeader32.SizeOfHeaders", Field, 3, ""},
  4470  		{"OptionalHeader32.SizeOfHeapCommit", Field, 3, ""},
  4471  		{"OptionalHeader32.SizeOfHeapReserve", Field, 3, ""},
  4472  		{"OptionalHeader32.SizeOfImage", Field, 3, ""},
  4473  		{"OptionalHeader32.SizeOfInitializedData", Field, 3, ""},
  4474  		{"OptionalHeader32.SizeOfStackCommit", Field, 3, ""},
  4475  		{"OptionalHeader32.SizeOfStackReserve", Field, 3, ""},
  4476  		{"OptionalHeader32.SizeOfUninitializedData", Field, 3, ""},
  4477  		{"OptionalHeader32.Subsystem", Field, 3, ""},
  4478  		{"OptionalHeader32.Win32VersionValue", Field, 3, ""},
  4479  		{"OptionalHeader64", Type, 3, ""},
  4480  		{"OptionalHeader64.AddressOfEntryPoint", Field, 3, ""},
  4481  		{"OptionalHeader64.BaseOfCode", Field, 3, ""},
  4482  		{"OptionalHeader64.CheckSum", Field, 3, ""},
  4483  		{"OptionalHeader64.DataDirectory", Field, 3, ""},
  4484  		{"OptionalHeader64.DllCharacteristics", Field, 3, ""},
  4485  		{"OptionalHeader64.FileAlignment", Field, 3, ""},
  4486  		{"OptionalHeader64.ImageBase", Field, 3, ""},
  4487  		{"OptionalHeader64.LoaderFlags", Field, 3, ""},
  4488  		{"OptionalHeader64.Magic", Field, 3, ""},
  4489  		{"OptionalHeader64.MajorImageVersion", Field, 3, ""},
  4490  		{"OptionalHeader64.MajorLinkerVersion", Field, 3, ""},
  4491  		{"OptionalHeader64.MajorOperatingSystemVersion", Field, 3, ""},
  4492  		{"OptionalHeader64.MajorSubsystemVersion", Field, 3, ""},
  4493  		{"OptionalHeader64.MinorImageVersion", Field, 3, ""},
  4494  		{"OptionalHeader64.MinorLinkerVersion", Field, 3, ""},
  4495  		{"OptionalHeader64.MinorOperatingSystemVersion", Field, 3, ""},
  4496  		{"OptionalHeader64.MinorSubsystemVersion", Field, 3, ""},
  4497  		{"OptionalHeader64.NumberOfRvaAndSizes", Field, 3, ""},
  4498  		{"OptionalHeader64.SectionAlignment", Field, 3, ""},
  4499  		{"OptionalHeader64.SizeOfCode", Field, 3, ""},
  4500  		{"OptionalHeader64.SizeOfHeaders", Field, 3, ""},
  4501  		{"OptionalHeader64.SizeOfHeapCommit", Field, 3, ""},
  4502  		{"OptionalHeader64.SizeOfHeapReserve", Field, 3, ""},
  4503  		{"OptionalHeader64.SizeOfImage", Field, 3, ""},
  4504  		{"OptionalHeader64.SizeOfInitializedData", Field, 3, ""},
  4505  		{"OptionalHeader64.SizeOfStackCommit", Field, 3, ""},
  4506  		{"OptionalHeader64.SizeOfStackReserve", Field, 3, ""},
  4507  		{"OptionalHeader64.SizeOfUninitializedData", Field, 3, ""},
  4508  		{"OptionalHeader64.Subsystem", Field, 3, ""},
  4509  		{"OptionalHeader64.Win32VersionValue", Field, 3, ""},
  4510  		{"Reloc", Type, 8, ""},
  4511  		{"Reloc.SymbolTableIndex", Field, 8, ""},
  4512  		{"Reloc.Type", Field, 8, ""},
  4513  		{"Reloc.VirtualAddress", Field, 8, ""},
  4514  		{"Section", Type, 0, ""},
  4515  		{"Section.ReaderAt", Field, 0, ""},
  4516  		{"Section.Relocs", Field, 8, ""},
  4517  		{"Section.SectionHeader", Field, 0, ""},
  4518  		{"SectionHeader", Type, 0, ""},
  4519  		{"SectionHeader.Characteristics", Field, 0, ""},
  4520  		{"SectionHeader.Name", Field, 0, ""},
  4521  		{"SectionHeader.NumberOfLineNumbers", Field, 0, ""},
  4522  		{"SectionHeader.NumberOfRelocations", Field, 0, ""},
  4523  		{"SectionHeader.Offset", Field, 0, ""},
  4524  		{"SectionHeader.PointerToLineNumbers", Field, 0, ""},
  4525  		{"SectionHeader.PointerToRelocations", Field, 0, ""},
  4526  		{"SectionHeader.Size", Field, 0, ""},
  4527  		{"SectionHeader.VirtualAddress", Field, 0, ""},
  4528  		{"SectionHeader.VirtualSize", Field, 0, ""},
  4529  		{"SectionHeader32", Type, 0, ""},
  4530  		{"SectionHeader32.Characteristics", Field, 0, ""},
  4531  		{"SectionHeader32.Name", Field, 0, ""},
  4532  		{"SectionHeader32.NumberOfLineNumbers", Field, 0, ""},
  4533  		{"SectionHeader32.NumberOfRelocations", Field, 0, ""},
  4534  		{"SectionHeader32.PointerToLineNumbers", Field, 0, ""},
  4535  		{"SectionHeader32.PointerToRawData", Field, 0, ""},
  4536  		{"SectionHeader32.PointerToRelocations", Field, 0, ""},
  4537  		{"SectionHeader32.SizeOfRawData", Field, 0, ""},
  4538  		{"SectionHeader32.VirtualAddress", Field, 0, ""},
  4539  		{"SectionHeader32.VirtualSize", Field, 0, ""},
  4540  		{"StringTable", Type, 8, ""},
  4541  		{"Symbol", Type, 1, ""},
  4542  		{"Symbol.Name", Field, 1, ""},
  4543  		{"Symbol.SectionNumber", Field, 1, ""},
  4544  		{"Symbol.StorageClass", Field, 1, ""},
  4545  		{"Symbol.Type", Field, 1, ""},
  4546  		{"Symbol.Value", Field, 1, ""},
  4547  	},
  4548  	"debug/plan9obj": {
  4549  		{"(*File).Close", Method, 3, ""},
  4550  		{"(*File).Section", Method, 3, ""},
  4551  		{"(*File).Symbols", Method, 3, ""},
  4552  		{"(*Section).Data", Method, 3, ""},
  4553  		{"(*Section).Open", Method, 3, ""},
  4554  		{"(Section).ReadAt", Method, 3, ""},
  4555  		{"ErrNoSymbols", Var, 18, ""},
  4556  		{"File", Type, 3, ""},
  4557  		{"File.FileHeader", Field, 3, ""},
  4558  		{"File.Sections", Field, 3, ""},
  4559  		{"FileHeader", Type, 3, ""},
  4560  		{"FileHeader.Bss", Field, 3, ""},
  4561  		{"FileHeader.Entry", Field, 3, ""},
  4562  		{"FileHeader.HdrSize", Field, 4, ""},
  4563  		{"FileHeader.LoadAddress", Field, 4, ""},
  4564  		{"FileHeader.Magic", Field, 3, ""},
  4565  		{"FileHeader.PtrSize", Field, 3, ""},
  4566  		{"Magic386", Const, 3, ""},
  4567  		{"Magic64", Const, 3, ""},
  4568  		{"MagicAMD64", Const, 3, ""},
  4569  		{"MagicARM", Const, 3, ""},
  4570  		{"NewFile", Func, 3, "func(r io.ReaderAt) (*File, error)"},
  4571  		{"Open", Func, 3, "func(name string) (*File, error)"},
  4572  		{"Section", Type, 3, ""},
  4573  		{"Section.ReaderAt", Field, 3, ""},
  4574  		{"Section.SectionHeader", Field, 3, ""},
  4575  		{"SectionHeader", Type, 3, ""},
  4576  		{"SectionHeader.Name", Field, 3, ""},
  4577  		{"SectionHeader.Offset", Field, 3, ""},
  4578  		{"SectionHeader.Size", Field, 3, ""},
  4579  		{"Sym", Type, 3, ""},
  4580  		{"Sym.Name", Field, 3, ""},
  4581  		{"Sym.Type", Field, 3, ""},
  4582  		{"Sym.Value", Field, 3, ""},
  4583  	},
  4584  	"embed": {
  4585  		{"(FS).Open", Method, 16, ""},
  4586  		{"(FS).ReadDir", Method, 16, ""},
  4587  		{"(FS).ReadFile", Method, 16, ""},
  4588  		{"FS", Type, 16, ""},
  4589  	},
  4590  	"encoding": {
  4591  		{"BinaryAppender", Type, 24, ""},
  4592  		{"BinaryMarshaler", Type, 2, ""},
  4593  		{"BinaryUnmarshaler", Type, 2, ""},
  4594  		{"TextAppender", Type, 24, ""},
  4595  		{"TextMarshaler", Type, 2, ""},
  4596  		{"TextUnmarshaler", Type, 2, ""},
  4597  	},
  4598  	"encoding/ascii85": {
  4599  		{"(CorruptInputError).Error", Method, 0, ""},
  4600  		{"CorruptInputError", Type, 0, ""},
  4601  		{"Decode", Func, 0, "func(dst []byte, src []byte, flush bool) (ndst int, nsrc int, err error)"},
  4602  		{"Encode", Func, 0, "func(dst []byte, src []byte) int"},
  4603  		{"MaxEncodedLen", Func, 0, "func(n int) int"},
  4604  		{"NewDecoder", Func, 0, "func(r io.Reader) io.Reader"},
  4605  		{"NewEncoder", Func, 0, "func(w io.Writer) io.WriteCloser"},
  4606  	},
  4607  	"encoding/asn1": {
  4608  		{"(BitString).At", Method, 0, ""},
  4609  		{"(BitString).RightAlign", Method, 0, ""},
  4610  		{"(ObjectIdentifier).Equal", Method, 0, ""},
  4611  		{"(ObjectIdentifier).String", Method, 3, ""},
  4612  		{"(StructuralError).Error", Method, 0, ""},
  4613  		{"(SyntaxError).Error", Method, 0, ""},
  4614  		{"BitString", Type, 0, ""},
  4615  		{"BitString.BitLength", Field, 0, ""},
  4616  		{"BitString.Bytes", Field, 0, ""},
  4617  		{"ClassApplication", Const, 6, ""},
  4618  		{"ClassContextSpecific", Const, 6, ""},
  4619  		{"ClassPrivate", Const, 6, ""},
  4620  		{"ClassUniversal", Const, 6, ""},
  4621  		{"Enumerated", Type, 0, ""},
  4622  		{"Flag", Type, 0, ""},
  4623  		{"Marshal", Func, 0, "func(val any) ([]byte, error)"},
  4624  		{"MarshalWithParams", Func, 10, "func(val any, params string) ([]byte, error)"},
  4625  		{"NullBytes", Var, 9, ""},
  4626  		{"NullRawValue", Var, 9, ""},
  4627  		{"ObjectIdentifier", Type, 0, ""},
  4628  		{"RawContent", Type, 0, ""},
  4629  		{"RawValue", Type, 0, ""},
  4630  		{"RawValue.Bytes", Field, 0, ""},
  4631  		{"RawValue.Class", Field, 0, ""},
  4632  		{"RawValue.FullBytes", Field, 0, ""},
  4633  		{"RawValue.IsCompound", Field, 0, ""},
  4634  		{"RawValue.Tag", Field, 0, ""},
  4635  		{"StructuralError", Type, 0, ""},
  4636  		{"StructuralError.Msg", Field, 0, ""},
  4637  		{"SyntaxError", Type, 0, ""},
  4638  		{"SyntaxError.Msg", Field, 0, ""},
  4639  		{"TagBMPString", Const, 14, ""},
  4640  		{"TagBitString", Const, 6, ""},
  4641  		{"TagBoolean", Const, 6, ""},
  4642  		{"TagEnum", Const, 6, ""},
  4643  		{"TagGeneralString", Const, 6, ""},
  4644  		{"TagGeneralizedTime", Const, 6, ""},
  4645  		{"TagIA5String", Const, 6, ""},
  4646  		{"TagInteger", Const, 6, ""},
  4647  		{"TagNull", Const, 9, ""},
  4648  		{"TagNumericString", Const, 10, ""},
  4649  		{"TagOID", Const, 6, ""},
  4650  		{"TagOctetString", Const, 6, ""},
  4651  		{"TagPrintableString", Const, 6, ""},
  4652  		{"TagSequence", Const, 6, ""},
  4653  		{"TagSet", Const, 6, ""},
  4654  		{"TagT61String", Const, 6, ""},
  4655  		{"TagUTCTime", Const, 6, ""},
  4656  		{"TagUTF8String", Const, 6, ""},
  4657  		{"Unmarshal", Func, 0, "func(b []byte, val any) (rest []byte, err error)"},
  4658  		{"UnmarshalWithParams", Func, 0, "func(b []byte, val any, params string) (rest []byte, err error)"},
  4659  	},
  4660  	"encoding/base32": {
  4661  		{"(*Encoding).AppendDecode", Method, 22, ""},
  4662  		{"(*Encoding).AppendEncode", Method, 22, ""},
  4663  		{"(*Encoding).Decode", Method, 0, ""},
  4664  		{"(*Encoding).DecodeString", Method, 0, ""},
  4665  		{"(*Encoding).DecodedLen", Method, 0, ""},
  4666  		{"(*Encoding).Encode", Method, 0, ""},
  4667  		{"(*Encoding).EncodeToString", Method, 0, ""},
  4668  		{"(*Encoding).EncodedLen", Method, 0, ""},
  4669  		{"(CorruptInputError).Error", Method, 0, ""},
  4670  		{"(Encoding).WithPadding", Method, 9, ""},
  4671  		{"CorruptInputError", Type, 0, ""},
  4672  		{"Encoding", Type, 0, ""},
  4673  		{"HexEncoding", Var, 0, ""},
  4674  		{"NewDecoder", Func, 0, "func(enc *Encoding, r io.Reader) io.Reader"},
  4675  		{"NewEncoder", Func, 0, "func(enc *Encoding, w io.Writer) io.WriteCloser"},
  4676  		{"NewEncoding", Func, 0, "func(encoder string) *Encoding"},
  4677  		{"NoPadding", Const, 9, ""},
  4678  		{"StdEncoding", Var, 0, ""},
  4679  		{"StdPadding", Const, 9, ""},
  4680  	},
  4681  	"encoding/base64": {
  4682  		{"(*Encoding).AppendDecode", Method, 22, ""},
  4683  		{"(*Encoding).AppendEncode", Method, 22, ""},
  4684  		{"(*Encoding).Decode", Method, 0, ""},
  4685  		{"(*Encoding).DecodeString", Method, 0, ""},
  4686  		{"(*Encoding).DecodedLen", Method, 0, ""},
  4687  		{"(*Encoding).Encode", Method, 0, ""},
  4688  		{"(*Encoding).EncodeToString", Method, 0, ""},
  4689  		{"(*Encoding).EncodedLen", Method, 0, ""},
  4690  		{"(CorruptInputError).Error", Method, 0, ""},
  4691  		{"(Encoding).Strict", Method, 8, ""},
  4692  		{"(Encoding).WithPadding", Method, 5, ""},
  4693  		{"CorruptInputError", Type, 0, ""},
  4694  		{"Encoding", Type, 0, ""},
  4695  		{"NewDecoder", Func, 0, "func(enc *Encoding, r io.Reader) io.Reader"},
  4696  		{"NewEncoder", Func, 0, "func(enc *Encoding, w io.Writer) io.WriteCloser"},
  4697  		{"NewEncoding", Func, 0, "func(encoder string) *Encoding"},
  4698  		{"NoPadding", Const, 5, ""},
  4699  		{"RawStdEncoding", Var, 5, ""},
  4700  		{"RawURLEncoding", Var, 5, ""},
  4701  		{"StdEncoding", Var, 0, ""},
  4702  		{"StdPadding", Const, 5, ""},
  4703  		{"URLEncoding", Var, 0, ""},
  4704  	},
  4705  	"encoding/binary": {
  4706  		{"Append", Func, 23, "func(buf []byte, order ByteOrder, data any) ([]byte, error)"},
  4707  		{"AppendByteOrder", Type, 19, ""},
  4708  		{"AppendUvarint", Func, 19, "func(buf []byte, x uint64) []byte"},
  4709  		{"AppendVarint", Func, 19, "func(buf []byte, x int64) []byte"},
  4710  		{"BigEndian", Var, 0, ""},
  4711  		{"ByteOrder", Type, 0, ""},
  4712  		{"Decode", Func, 23, "func(buf []byte, order ByteOrder, data any) (int, error)"},
  4713  		{"Encode", Func, 23, "func(buf []byte, order ByteOrder, data any) (int, error)"},
  4714  		{"LittleEndian", Var, 0, ""},
  4715  		{"MaxVarintLen16", Const, 0, ""},
  4716  		{"MaxVarintLen32", Const, 0, ""},
  4717  		{"MaxVarintLen64", Const, 0, ""},
  4718  		{"NativeEndian", Var, 21, ""},
  4719  		{"PutUvarint", Func, 0, "func(buf []byte, x uint64) int"},
  4720  		{"PutVarint", Func, 0, "func(buf []byte, x int64) int"},
  4721  		{"Read", Func, 0, "func(r io.Reader, order ByteOrder, data any) error"},
  4722  		{"ReadUvarint", Func, 0, "func(r io.ByteReader) (uint64, error)"},
  4723  		{"ReadVarint", Func, 0, "func(r io.ByteReader) (int64, error)"},
  4724  		{"Size", Func, 0, "func(v any) int"},
  4725  		{"Uvarint", Func, 0, "func(buf []byte) (uint64, int)"},
  4726  		{"Varint", Func, 0, "func(buf []byte) (int64, int)"},
  4727  		{"Write", Func, 0, "func(w io.Writer, order ByteOrder, data any) error"},
  4728  	},
  4729  	"encoding/csv": {
  4730  		{"(*ParseError).Error", Method, 0, ""},
  4731  		{"(*ParseError).Unwrap", Method, 13, ""},
  4732  		{"(*Reader).FieldPos", Method, 17, ""},
  4733  		{"(*Reader).InputOffset", Method, 19, ""},
  4734  		{"(*Reader).Read", Method, 0, ""},
  4735  		{"(*Reader).ReadAll", Method, 0, ""},
  4736  		{"(*Writer).Error", Method, 1, ""},
  4737  		{"(*Writer).Flush", Method, 0, ""},
  4738  		{"(*Writer).Write", Method, 0, ""},
  4739  		{"(*Writer).WriteAll", Method, 0, ""},
  4740  		{"ErrBareQuote", Var, 0, ""},
  4741  		{"ErrFieldCount", Var, 0, ""},
  4742  		{"ErrQuote", Var, 0, ""},
  4743  		{"ErrTrailingComma", Var, 0, ""},
  4744  		{"NewReader", Func, 0, "func(r io.Reader) *Reader"},
  4745  		{"NewWriter", Func, 0, "func(w io.Writer) *Writer"},
  4746  		{"ParseError", Type, 0, ""},
  4747  		{"ParseError.Column", Field, 0, ""},
  4748  		{"ParseError.Err", Field, 0, ""},
  4749  		{"ParseError.Line", Field, 0, ""},
  4750  		{"ParseError.StartLine", Field, 10, ""},
  4751  		{"Reader", Type, 0, ""},
  4752  		{"Reader.Comma", Field, 0, ""},
  4753  		{"Reader.Comment", Field, 0, ""},
  4754  		{"Reader.FieldsPerRecord", Field, 0, ""},
  4755  		{"Reader.LazyQuotes", Field, 0, ""},
  4756  		{"Reader.ReuseRecord", Field, 9, ""},
  4757  		{"Reader.TrailingComma", Field, 0, ""},
  4758  		{"Reader.TrimLeadingSpace", Field, 0, ""},
  4759  		{"Writer", Type, 0, ""},
  4760  		{"Writer.Comma", Field, 0, ""},
  4761  		{"Writer.UseCRLF", Field, 0, ""},
  4762  	},
  4763  	"encoding/gob": {
  4764  		{"(*Decoder).Decode", Method, 0, ""},
  4765  		{"(*Decoder).DecodeValue", Method, 0, ""},
  4766  		{"(*Encoder).Encode", Method, 0, ""},
  4767  		{"(*Encoder).EncodeValue", Method, 0, ""},
  4768  		{"CommonType", Type, 0, ""},
  4769  		{"CommonType.Id", Field, 0, ""},
  4770  		{"CommonType.Name", Field, 0, ""},
  4771  		{"Decoder", Type, 0, ""},
  4772  		{"Encoder", Type, 0, ""},
  4773  		{"GobDecoder", Type, 0, ""},
  4774  		{"GobEncoder", Type, 0, ""},
  4775  		{"NewDecoder", Func, 0, "func(r io.Reader) *Decoder"},
  4776  		{"NewEncoder", Func, 0, "func(w io.Writer) *Encoder"},
  4777  		{"Register", Func, 0, "func(value any)"},
  4778  		{"RegisterName", Func, 0, "func(name string, value any)"},
  4779  	},
  4780  	"encoding/hex": {
  4781  		{"(InvalidByteError).Error", Method, 0, ""},
  4782  		{"AppendDecode", Func, 22, "func(dst []byte, src []byte) ([]byte, error)"},
  4783  		{"AppendEncode", Func, 22, "func(dst []byte, src []byte) []byte"},
  4784  		{"Decode", Func, 0, "func(dst []byte, src []byte) (int, error)"},
  4785  		{"DecodeString", Func, 0, "func(s string) ([]byte, error)"},
  4786  		{"DecodedLen", Func, 0, "func(x int) int"},
  4787  		{"Dump", Func, 0, "func(data []byte) string"},
  4788  		{"Dumper", Func, 0, "func(w io.Writer) io.WriteCloser"},
  4789  		{"Encode", Func, 0, "func(dst []byte, src []byte) int"},
  4790  		{"EncodeToString", Func, 0, "func(src []byte) string"},
  4791  		{"EncodedLen", Func, 0, "func(n int) int"},
  4792  		{"ErrLength", Var, 0, ""},
  4793  		{"InvalidByteError", Type, 0, ""},
  4794  		{"NewDecoder", Func, 10, "func(r io.Reader) io.Reader"},
  4795  		{"NewEncoder", Func, 10, "func(w io.Writer) io.Writer"},
  4796  	},
  4797  	"encoding/json": {
  4798  		{"(*Decoder).Buffered", Method, 1, ""},
  4799  		{"(*Decoder).Decode", Method, 0, ""},
  4800  		{"(*Decoder).DisallowUnknownFields", Method, 10, ""},
  4801  		{"(*Decoder).InputOffset", Method, 14, ""},
  4802  		{"(*Decoder).More", Method, 5, ""},
  4803  		{"(*Decoder).Token", Method, 5, ""},
  4804  		{"(*Decoder).UseNumber", Method, 1, ""},
  4805  		{"(*Encoder).Encode", Method, 0, ""},
  4806  		{"(*Encoder).SetEscapeHTML", Method, 7, ""},
  4807  		{"(*Encoder).SetIndent", Method, 7, ""},
  4808  		{"(*InvalidUTF8Error).Error", Method, 0, ""},
  4809  		{"(*InvalidUnmarshalError).Error", Method, 0, ""},
  4810  		{"(*MarshalerError).Error", Method, 0, ""},
  4811  		{"(*MarshalerError).Unwrap", Method, 13, ""},
  4812  		{"(*RawMessage).MarshalJSON", Method, 0, ""},
  4813  		{"(*RawMessage).UnmarshalJSON", Method, 0, ""},
  4814  		{"(*SyntaxError).Error", Method, 0, ""},
  4815  		{"(*UnmarshalFieldError).Error", Method, 0, ""},
  4816  		{"(*UnmarshalTypeError).Error", Method, 0, ""},
  4817  		{"(*UnsupportedTypeError).Error", Method, 0, ""},
  4818  		{"(*UnsupportedValueError).Error", Method, 0, ""},
  4819  		{"(Delim).String", Method, 5, ""},
  4820  		{"(Number).Float64", Method, 1, ""},
  4821  		{"(Number).Int64", Method, 1, ""},
  4822  		{"(Number).String", Method, 1, ""},
  4823  		{"(RawMessage).MarshalJSON", Method, 8, ""},
  4824  		{"Compact", Func, 0, "func(dst *bytes.Buffer, src []byte) error"},
  4825  		{"Decoder", Type, 0, ""},
  4826  		{"Delim", Type, 5, ""},
  4827  		{"Encoder", Type, 0, ""},
  4828  		{"HTMLEscape", Func, 0, "func(dst *bytes.Buffer, src []byte)"},
  4829  		{"Indent", Func, 0, "func(dst *bytes.Buffer, src []byte, prefix string, indent string) error"},
  4830  		{"InvalidUTF8Error", Type, 0, ""},
  4831  		{"InvalidUTF8Error.S", Field, 0, ""},
  4832  		{"InvalidUnmarshalError", Type, 0, ""},
  4833  		{"InvalidUnmarshalError.Type", Field, 0, ""},
  4834  		{"Marshal", Func, 0, "func(v any) ([]byte, error)"},
  4835  		{"MarshalIndent", Func, 0, "func(v any, prefix string, indent string) ([]byte, error)"},
  4836  		{"Marshaler", Type, 0, ""},
  4837  		{"MarshalerError", Type, 0, ""},
  4838  		{"MarshalerError.Err", Field, 0, ""},
  4839  		{"MarshalerError.Type", Field, 0, ""},
  4840  		{"NewDecoder", Func, 0, "func(r io.Reader) *Decoder"},
  4841  		{"NewEncoder", Func, 0, "func(w io.Writer) *Encoder"},
  4842  		{"Number", Type, 1, ""},
  4843  		{"RawMessage", Type, 0, ""},
  4844  		{"SyntaxError", Type, 0, ""},
  4845  		{"SyntaxError.Offset", Field, 0, ""},
  4846  		{"Token", Type, 5, ""},
  4847  		{"Unmarshal", Func, 0, "func(data []byte, v any) error"},
  4848  		{"UnmarshalFieldError", Type, 0, ""},
  4849  		{"UnmarshalFieldError.Field", Field, 0, ""},
  4850  		{"UnmarshalFieldError.Key", Field, 0, ""},
  4851  		{"UnmarshalFieldError.Type", Field, 0, ""},
  4852  		{"UnmarshalTypeError", Type, 0, ""},
  4853  		{"UnmarshalTypeError.Field", Field, 8, ""},
  4854  		{"UnmarshalTypeError.Offset", Field, 5, ""},
  4855  		{"UnmarshalTypeError.Struct", Field, 8, ""},
  4856  		{"UnmarshalTypeError.Type", Field, 0, ""},
  4857  		{"UnmarshalTypeError.Value", Field, 0, ""},
  4858  		{"Unmarshaler", Type, 0, ""},
  4859  		{"UnsupportedTypeError", Type, 0, ""},
  4860  		{"UnsupportedTypeError.Type", Field, 0, ""},
  4861  		{"UnsupportedValueError", Type, 0, ""},
  4862  		{"UnsupportedValueError.Str", Field, 0, ""},
  4863  		{"UnsupportedValueError.Value", Field, 0, ""},
  4864  		{"Valid", Func, 9, "func(data []byte) bool"},
  4865  	},
  4866  	"encoding/pem": {
  4867  		{"Block", Type, 0, ""},
  4868  		{"Block.Bytes", Field, 0, ""},
  4869  		{"Block.Headers", Field, 0, ""},
  4870  		{"Block.Type", Field, 0, ""},
  4871  		{"Decode", Func, 0, "func(data []byte) (p *Block, rest []byte)"},
  4872  		{"Encode", Func, 0, "func(out io.Writer, b *Block) error"},
  4873  		{"EncodeToMemory", Func, 0, "func(b *Block) []byte"},
  4874  	},
  4875  	"encoding/xml": {
  4876  		{"(*Decoder).Decode", Method, 0, ""},
  4877  		{"(*Decoder).DecodeElement", Method, 0, ""},
  4878  		{"(*Decoder).InputOffset", Method, 4, ""},
  4879  		{"(*Decoder).InputPos", Method, 19, ""},
  4880  		{"(*Decoder).RawToken", Method, 0, ""},
  4881  		{"(*Decoder).Skip", Method, 0, ""},
  4882  		{"(*Decoder).Token", Method, 0, ""},
  4883  		{"(*Encoder).Close", Method, 20, ""},
  4884  		{"(*Encoder).Encode", Method, 0, ""},
  4885  		{"(*Encoder).EncodeElement", Method, 2, ""},
  4886  		{"(*Encoder).EncodeToken", Method, 2, ""},
  4887  		{"(*Encoder).Flush", Method, 2, ""},
  4888  		{"(*Encoder).Indent", Method, 1, ""},
  4889  		{"(*SyntaxError).Error", Method, 0, ""},
  4890  		{"(*TagPathError).Error", Method, 0, ""},
  4891  		{"(*UnsupportedTypeError).Error", Method, 0, ""},
  4892  		{"(CharData).Copy", Method, 0, ""},
  4893  		{"(Comment).Copy", Method, 0, ""},
  4894  		{"(Directive).Copy", Method, 0, ""},
  4895  		{"(ProcInst).Copy", Method, 0, ""},
  4896  		{"(StartElement).Copy", Method, 0, ""},
  4897  		{"(StartElement).End", Method, 2, ""},
  4898  		{"(UnmarshalError).Error", Method, 0, ""},
  4899  		{"Attr", Type, 0, ""},
  4900  		{"Attr.Name", Field, 0, ""},
  4901  		{"Attr.Value", Field, 0, ""},
  4902  		{"CharData", Type, 0, ""},
  4903  		{"Comment", Type, 0, ""},
  4904  		{"CopyToken", Func, 0, "func(t Token) Token"},
  4905  		{"Decoder", Type, 0, ""},
  4906  		{"Decoder.AutoClose", Field, 0, ""},
  4907  		{"Decoder.CharsetReader", Field, 0, ""},
  4908  		{"Decoder.DefaultSpace", Field, 1, ""},
  4909  		{"Decoder.Entity", Field, 0, ""},
  4910  		{"Decoder.Strict", Field, 0, ""},
  4911  		{"Directive", Type, 0, ""},
  4912  		{"Encoder", Type, 0, ""},
  4913  		{"EndElement", Type, 0, ""},
  4914  		{"EndElement.Name", Field, 0, ""},
  4915  		{"Escape", Func, 0, "func(w io.Writer, s []byte)"},
  4916  		{"EscapeText", Func, 1, "func(w io.Writer, s []byte) error"},
  4917  		{"HTMLAutoClose", Var, 0, ""},
  4918  		{"HTMLEntity", Var, 0, ""},
  4919  		{"Header", Const, 0, ""},
  4920  		{"Marshal", Func, 0, "func(v any) ([]byte, error)"},
  4921  		{"MarshalIndent", Func, 0, "func(v any, prefix string, indent string) ([]byte, error)"},
  4922  		{"Marshaler", Type, 2, ""},
  4923  		{"MarshalerAttr", Type, 2, ""},
  4924  		{"Name", Type, 0, ""},
  4925  		{"Name.Local", Field, 0, ""},
  4926  		{"Name.Space", Field, 0, ""},
  4927  		{"NewDecoder", Func, 0, "func(r io.Reader) *Decoder"},
  4928  		{"NewEncoder", Func, 0, "func(w io.Writer) *Encoder"},
  4929  		{"NewTokenDecoder", Func, 10, "func(t TokenReader) *Decoder"},
  4930  		{"ProcInst", Type, 0, ""},
  4931  		{"ProcInst.Inst", Field, 0, ""},
  4932  		{"ProcInst.Target", Field, 0, ""},
  4933  		{"StartElement", Type, 0, ""},
  4934  		{"StartElement.Attr", Field, 0, ""},
  4935  		{"StartElement.Name", Field, 0, ""},
  4936  		{"SyntaxError", Type, 0, ""},
  4937  		{"SyntaxError.Line", Field, 0, ""},
  4938  		{"SyntaxError.Msg", Field, 0, ""},
  4939  		{"TagPathError", Type, 0, ""},
  4940  		{"TagPathError.Field1", Field, 0, ""},
  4941  		{"TagPathError.Field2", Field, 0, ""},
  4942  		{"TagPathError.Struct", Field, 0, ""},
  4943  		{"TagPathError.Tag1", Field, 0, ""},
  4944  		{"TagPathError.Tag2", Field, 0, ""},
  4945  		{"Token", Type, 0, ""},
  4946  		{"TokenReader", Type, 10, ""},
  4947  		{"Unmarshal", Func, 0, "func(data []byte, v any) error"},
  4948  		{"UnmarshalError", Type, 0, ""},
  4949  		{"Unmarshaler", Type, 2, ""},
  4950  		{"UnmarshalerAttr", Type, 2, ""},
  4951  		{"UnsupportedTypeError", Type, 0, ""},
  4952  		{"UnsupportedTypeError.Type", Field, 0, ""},
  4953  	},
  4954  	"errors": {
  4955  		{"As", Func, 13, "func(err error, target any) bool"},
  4956  		{"ErrUnsupported", Var, 21, ""},
  4957  		{"Is", Func, 13, "func(err error, target error) bool"},
  4958  		{"Join", Func, 20, "func(errs ...error) error"},
  4959  		{"New", Func, 0, "func(text string) error"},
  4960  		{"Unwrap", Func, 13, "func(err error) error"},
  4961  	},
  4962  	"expvar": {
  4963  		{"(*Float).Add", Method, 0, ""},
  4964  		{"(*Float).Set", Method, 0, ""},
  4965  		{"(*Float).String", Method, 0, ""},
  4966  		{"(*Float).Value", Method, 8, ""},
  4967  		{"(*Int).Add", Method, 0, ""},
  4968  		{"(*Int).Set", Method, 0, ""},
  4969  		{"(*Int).String", Method, 0, ""},
  4970  		{"(*Int).Value", Method, 8, ""},
  4971  		{"(*Map).Add", Method, 0, ""},
  4972  		{"(*Map).AddFloat", Method, 0, ""},
  4973  		{"(*Map).Delete", Method, 12, ""},
  4974  		{"(*Map).Do", Method, 0, ""},
  4975  		{"(*Map).Get", Method, 0, ""},
  4976  		{"(*Map).Init", Method, 0, ""},
  4977  		{"(*Map).Set", Method, 0, ""},
  4978  		{"(*Map).String", Method, 0, ""},
  4979  		{"(*String).Set", Method, 0, ""},
  4980  		{"(*String).String", Method, 0, ""},
  4981  		{"(*String).Value", Method, 8, ""},
  4982  		{"(Func).String", Method, 0, ""},
  4983  		{"(Func).Value", Method, 8, ""},
  4984  		{"Do", Func, 0, "func(f func(KeyValue))"},
  4985  		{"Float", Type, 0, ""},
  4986  		{"Func", Type, 0, ""},
  4987  		{"Get", Func, 0, "func(name string) Var"},
  4988  		{"Handler", Func, 8, "func() http.Handler"},
  4989  		{"Int", Type, 0, ""},
  4990  		{"KeyValue", Type, 0, ""},
  4991  		{"KeyValue.Key", Field, 0, ""},
  4992  		{"KeyValue.Value", Field, 0, ""},
  4993  		{"Map", Type, 0, ""},
  4994  		{"NewFloat", Func, 0, "func(name string) *Float"},
  4995  		{"NewInt", Func, 0, "func(name string) *Int"},
  4996  		{"NewMap", Func, 0, "func(name string) *Map"},
  4997  		{"NewString", Func, 0, "func(name string) *String"},
  4998  		{"Publish", Func, 0, "func(name string, v Var)"},
  4999  		{"String", Type, 0, ""},
  5000  		{"Var", Type, 0, ""},
  5001  	},
  5002  	"flag": {
  5003  		{"(*FlagSet).Arg", Method, 0, ""},
  5004  		{"(*FlagSet).Args", Method, 0, ""},
  5005  		{"(*FlagSet).Bool", Method, 0, ""},
  5006  		{"(*FlagSet).BoolFunc", Method, 21, ""},
  5007  		{"(*FlagSet).BoolVar", Method, 0, ""},
  5008  		{"(*FlagSet).Duration", Method, 0, ""},
  5009  		{"(*FlagSet).DurationVar", Method, 0, ""},
  5010  		{"(*FlagSet).ErrorHandling", Method, 10, ""},
  5011  		{"(*FlagSet).Float64", Method, 0, ""},
  5012  		{"(*FlagSet).Float64Var", Method, 0, ""},
  5013  		{"(*FlagSet).Func", Method, 16, ""},
  5014  		{"(*FlagSet).Init", Method, 0, ""},
  5015  		{"(*FlagSet).Int", Method, 0, ""},
  5016  		{"(*FlagSet).Int64", Method, 0, ""},
  5017  		{"(*FlagSet).Int64Var", Method, 0, ""},
  5018  		{"(*FlagSet).IntVar", Method, 0, ""},
  5019  		{"(*FlagSet).Lookup", Method, 0, ""},
  5020  		{"(*FlagSet).NArg", Method, 0, ""},
  5021  		{"(*FlagSet).NFlag", Method, 0, ""},
  5022  		{"(*FlagSet).Name", Method, 10, ""},
  5023  		{"(*FlagSet).Output", Method, 10, ""},
  5024  		{"(*FlagSet).Parse", Method, 0, ""},
  5025  		{"(*FlagSet).Parsed", Method, 0, ""},
  5026  		{"(*FlagSet).PrintDefaults", Method, 0, ""},
  5027  		{"(*FlagSet).Set", Method, 0, ""},
  5028  		{"(*FlagSet).SetOutput", Method, 0, ""},
  5029  		{"(*FlagSet).String", Method, 0, ""},
  5030  		{"(*FlagSet).StringVar", Method, 0, ""},
  5031  		{"(*FlagSet).TextVar", Method, 19, ""},
  5032  		{"(*FlagSet).Uint", Method, 0, ""},
  5033  		{"(*FlagSet).Uint64", Method, 0, ""},
  5034  		{"(*FlagSet).Uint64Var", Method, 0, ""},
  5035  		{"(*FlagSet).UintVar", Method, 0, ""},
  5036  		{"(*FlagSet).Var", Method, 0, ""},
  5037  		{"(*FlagSet).Visit", Method, 0, ""},
  5038  		{"(*FlagSet).VisitAll", Method, 0, ""},
  5039  		{"Arg", Func, 0, "func(i int) string"},
  5040  		{"Args", Func, 0, "func() []string"},
  5041  		{"Bool", Func, 0, "func(name string, value bool, usage string) *bool"},
  5042  		{"BoolFunc", Func, 21, "func(name string, usage string, fn func(string) error)"},
  5043  		{"BoolVar", Func, 0, "func(p *bool, name string, value bool, usage string)"},
  5044  		{"CommandLine", Var, 2, ""},
  5045  		{"ContinueOnError", Const, 0, ""},
  5046  		{"Duration", Func, 0, "func(name string, value time.Duration, usage string) *time.Duration"},
  5047  		{"DurationVar", Func, 0, "func(p *time.Duration, name string, value time.Duration, usage string)"},
  5048  		{"ErrHelp", Var, 0, ""},
  5049  		{"ErrorHandling", Type, 0, ""},
  5050  		{"ExitOnError", Const, 0, ""},
  5051  		{"Flag", Type, 0, ""},
  5052  		{"Flag.DefValue", Field, 0, ""},
  5053  		{"Flag.Name", Field, 0, ""},
  5054  		{"Flag.Usage", Field, 0, ""},
  5055  		{"Flag.Value", Field, 0, ""},
  5056  		{"FlagSet", Type, 0, ""},
  5057  		{"FlagSet.Usage", Field, 0, ""},
  5058  		{"Float64", Func, 0, "func(name string, value float64, usage string) *float64"},
  5059  		{"Float64Var", Func, 0, "func(p *float64, name string, value float64, usage string)"},
  5060  		{"Func", Func, 16, "func(name string, usage string, fn func(string) error)"},
  5061  		{"Getter", Type, 2, ""},
  5062  		{"Int", Func, 0, "func(name string, value int, usage string) *int"},
  5063  		{"Int64", Func, 0, "func(name string, value int64, usage string) *int64"},
  5064  		{"Int64Var", Func, 0, "func(p *int64, name string, value int64, usage string)"},
  5065  		{"IntVar", Func, 0, "func(p *int, name string, value int, usage string)"},
  5066  		{"Lookup", Func, 0, "func(name string) *Flag"},
  5067  		{"NArg", Func, 0, "func() int"},
  5068  		{"NFlag", Func, 0, "func() int"},
  5069  		{"NewFlagSet", Func, 0, "func(name string, errorHandling ErrorHandling) *FlagSet"},
  5070  		{"PanicOnError", Const, 0, ""},
  5071  		{"Parse", Func, 0, "func()"},
  5072  		{"Parsed", Func, 0, "func() bool"},
  5073  		{"PrintDefaults", Func, 0, "func()"},
  5074  		{"Set", Func, 0, "func(name string, value string) error"},
  5075  		{"String", Func, 0, "func(name string, value string, usage string) *string"},
  5076  		{"StringVar", Func, 0, "func(p *string, name string, value string, usage string)"},
  5077  		{"TextVar", Func, 19, "func(p encoding.TextUnmarshaler, name string, value encoding.TextMarshaler, usage string)"},
  5078  		{"Uint", Func, 0, "func(name string, value uint, usage string) *uint"},
  5079  		{"Uint64", Func, 0, "func(name string, value uint64, usage string) *uint64"},
  5080  		{"Uint64Var", Func, 0, "func(p *uint64, name string, value uint64, usage string)"},
  5081  		{"UintVar", Func, 0, "func(p *uint, name string, value uint, usage string)"},
  5082  		{"UnquoteUsage", Func, 5, "func(flag *Flag) (name string, usage string)"},
  5083  		{"Usage", Var, 0, ""},
  5084  		{"Value", Type, 0, ""},
  5085  		{"Var", Func, 0, "func(value Value, name string, usage string)"},
  5086  		{"Visit", Func, 0, "func(fn func(*Flag))"},
  5087  		{"VisitAll", Func, 0, "func(fn func(*Flag))"},
  5088  	},
  5089  	"fmt": {
  5090  		{"Append", Func, 19, "func(b []byte, a ...any) []byte"},
  5091  		{"Appendf", Func, 19, "func(b []byte, format string, a ...any) []byte"},
  5092  		{"Appendln", Func, 19, "func(b []byte, a ...any) []byte"},
  5093  		{"Errorf", Func, 0, "func(format string, a ...any) error"},
  5094  		{"FormatString", Func, 20, "func(state State, verb rune) string"},
  5095  		{"Formatter", Type, 0, ""},
  5096  		{"Fprint", Func, 0, "func(w io.Writer, a ...any) (n int, err error)"},
  5097  		{"Fprintf", Func, 0, "func(w io.Writer, format string, a ...any) (n int, err error)"},
  5098  		{"Fprintln", Func, 0, "func(w io.Writer, a ...any) (n int, err error)"},
  5099  		{"Fscan", Func, 0, "func(r io.Reader, a ...any) (n int, err error)"},
  5100  		{"Fscanf", Func, 0, "func(r io.Reader, format string, a ...any) (n int, err error)"},
  5101  		{"Fscanln", Func, 0, "func(r io.Reader, a ...any) (n int, err error)"},
  5102  		{"GoStringer", Type, 0, ""},
  5103  		{"Print", Func, 0, "func(a ...any) (n int, err error)"},
  5104  		{"Printf", Func, 0, "func(format string, a ...any) (n int, err error)"},
  5105  		{"Println", Func, 0, "func(a ...any) (n int, err error)"},
  5106  		{"Scan", Func, 0, "func(a ...any) (n int, err error)"},
  5107  		{"ScanState", Type, 0, ""},
  5108  		{"Scanf", Func, 0, "func(format string, a ...any) (n int, err error)"},
  5109  		{"Scanln", Func, 0, "func(a ...any) (n int, err error)"},
  5110  		{"Scanner", Type, 0, ""},
  5111  		{"Sprint", Func, 0, "func(a ...any) string"},
  5112  		{"Sprintf", Func, 0, "func(format string, a ...any) string"},
  5113  		{"Sprintln", Func, 0, "func(a ...any) string"},
  5114  		{"Sscan", Func, 0, "func(str string, a ...any) (n int, err error)"},
  5115  		{"Sscanf", Func, 0, "func(str string, format string, a ...any) (n int, err error)"},
  5116  		{"Sscanln", Func, 0, "func(str string, a ...any) (n int, err error)"},
  5117  		{"State", Type, 0, ""},
  5118  		{"Stringer", Type, 0, ""},
  5119  	},
  5120  	"go/ast": {
  5121  		{"(*ArrayType).End", Method, 0, ""},
  5122  		{"(*ArrayType).Pos", Method, 0, ""},
  5123  		{"(*AssignStmt).End", Method, 0, ""},
  5124  		{"(*AssignStmt).Pos", Method, 0, ""},
  5125  		{"(*BadDecl).End", Method, 0, ""},
  5126  		{"(*BadDecl).Pos", Method, 0, ""},
  5127  		{"(*BadExpr).End", Method, 0, ""},
  5128  		{"(*BadExpr).Pos", Method, 0, ""},
  5129  		{"(*BadStmt).End", Method, 0, ""},
  5130  		{"(*BadStmt).Pos", Method, 0, ""},
  5131  		{"(*BasicLit).End", Method, 0, ""},
  5132  		{"(*BasicLit).Pos", Method, 0, ""},
  5133  		{"(*BinaryExpr).End", Method, 0, ""},
  5134  		{"(*BinaryExpr).Pos", Method, 0, ""},
  5135  		{"(*BlockStmt).End", Method, 0, ""},
  5136  		{"(*BlockStmt).Pos", Method, 0, ""},
  5137  		{"(*BranchStmt).End", Method, 0, ""},
  5138  		{"(*BranchStmt).Pos", Method, 0, ""},
  5139  		{"(*CallExpr).End", Method, 0, ""},
  5140  		{"(*CallExpr).Pos", Method, 0, ""},
  5141  		{"(*CaseClause).End", Method, 0, ""},
  5142  		{"(*CaseClause).Pos", Method, 0, ""},
  5143  		{"(*ChanType).End", Method, 0, ""},
  5144  		{"(*ChanType).Pos", Method, 0, ""},
  5145  		{"(*CommClause).End", Method, 0, ""},
  5146  		{"(*CommClause).Pos", Method, 0, ""},
  5147  		{"(*Comment).End", Method, 0, ""},
  5148  		{"(*Comment).Pos", Method, 0, ""},
  5149  		{"(*CommentGroup).End", Method, 0, ""},
  5150  		{"(*CommentGroup).Pos", Method, 0, ""},
  5151  		{"(*CommentGroup).Text", Method, 0, ""},
  5152  		{"(*CompositeLit).End", Method, 0, ""},
  5153  		{"(*CompositeLit).Pos", Method, 0, ""},
  5154  		{"(*DeclStmt).End", Method, 0, ""},
  5155  		{"(*DeclStmt).Pos", Method, 0, ""},
  5156  		{"(*DeferStmt).End", Method, 0, ""},
  5157  		{"(*DeferStmt).Pos", Method, 0, ""},
  5158  		{"(*Ellipsis).End", Method, 0, ""},
  5159  		{"(*Ellipsis).Pos", Method, 0, ""},
  5160  		{"(*EmptyStmt).End", Method, 0, ""},
  5161  		{"(*EmptyStmt).Pos", Method, 0, ""},
  5162  		{"(*ExprStmt).End", Method, 0, ""},
  5163  		{"(*ExprStmt).Pos", Method, 0, ""},
  5164  		{"(*Field).End", Method, 0, ""},
  5165  		{"(*Field).Pos", Method, 0, ""},
  5166  		{"(*FieldList).End", Method, 0, ""},
  5167  		{"(*FieldList).NumFields", Method, 0, ""},
  5168  		{"(*FieldList).Pos", Method, 0, ""},
  5169  		{"(*File).End", Method, 0, ""},
  5170  		{"(*File).Pos", Method, 0, ""},
  5171  		{"(*ForStmt).End", Method, 0, ""},
  5172  		{"(*ForStmt).Pos", Method, 0, ""},
  5173  		{"(*FuncDecl).End", Method, 0, ""},
  5174  		{"(*FuncDecl).Pos", Method, 0, ""},
  5175  		{"(*FuncLit).End", Method, 0, ""},
  5176  		{"(*FuncLit).Pos", Method, 0, ""},
  5177  		{"(*FuncType).End", Method, 0, ""},
  5178  		{"(*FuncType).Pos", Method, 0, ""},
  5179  		{"(*GenDecl).End", Method, 0, ""},
  5180  		{"(*GenDecl).Pos", Method, 0, ""},
  5181  		{"(*GoStmt).End", Method, 0, ""},
  5182  		{"(*GoStmt).Pos", Method, 0, ""},
  5183  		{"(*Ident).End", Method, 0, ""},
  5184  		{"(*Ident).IsExported", Method, 0, ""},
  5185  		{"(*Ident).Pos", Method, 0, ""},
  5186  		{"(*Ident).String", Method, 0, ""},
  5187  		{"(*IfStmt).End", Method, 0, ""},
  5188  		{"(*IfStmt).Pos", Method, 0, ""},
  5189  		{"(*ImportSpec).End", Method, 0, ""},
  5190  		{"(*ImportSpec).Pos", Method, 0, ""},
  5191  		{"(*IncDecStmt).End", Method, 0, ""},
  5192  		{"(*IncDecStmt).Pos", Method, 0, ""},
  5193  		{"(*IndexExpr).End", Method, 0, ""},
  5194  		{"(*IndexExpr).Pos", Method, 0, ""},
  5195  		{"(*IndexListExpr).End", Method, 18, ""},
  5196  		{"(*IndexListExpr).Pos", Method, 18, ""},
  5197  		{"(*InterfaceType).End", Method, 0, ""},
  5198  		{"(*InterfaceType).Pos", Method, 0, ""},
  5199  		{"(*KeyValueExpr).End", Method, 0, ""},
  5200  		{"(*KeyValueExpr).Pos", Method, 0, ""},
  5201  		{"(*LabeledStmt).End", Method, 0, ""},
  5202  		{"(*LabeledStmt).Pos", Method, 0, ""},
  5203  		{"(*MapType).End", Method, 0, ""},
  5204  		{"(*MapType).Pos", Method, 0, ""},
  5205  		{"(*Object).Pos", Method, 0, ""},
  5206  		{"(*Package).End", Method, 0, ""},
  5207  		{"(*Package).Pos", Method, 0, ""},
  5208  		{"(*ParenExpr).End", Method, 0, ""},
  5209  		{"(*ParenExpr).Pos", Method, 0, ""},
  5210  		{"(*RangeStmt).End", Method, 0, ""},
  5211  		{"(*RangeStmt).Pos", Method, 0, ""},
  5212  		{"(*ReturnStmt).End", Method, 0, ""},
  5213  		{"(*ReturnStmt).Pos", Method, 0, ""},
  5214  		{"(*Scope).Insert", Method, 0, ""},
  5215  		{"(*Scope).Lookup", Method, 0, ""},
  5216  		{"(*Scope).String", Method, 0, ""},
  5217  		{"(*SelectStmt).End", Method, 0, ""},
  5218  		{"(*SelectStmt).Pos", Method, 0, ""},
  5219  		{"(*SelectorExpr).End", Method, 0, ""},
  5220  		{"(*SelectorExpr).Pos", Method, 0, ""},
  5221  		{"(*SendStmt).End", Method, 0, ""},
  5222  		{"(*SendStmt).Pos", Method, 0, ""},
  5223  		{"(*SliceExpr).End", Method, 0, ""},
  5224  		{"(*SliceExpr).Pos", Method, 0, ""},
  5225  		{"(*StarExpr).End", Method, 0, ""},
  5226  		{"(*StarExpr).Pos", Method, 0, ""},
  5227  		{"(*StructType).End", Method, 0, ""},
  5228  		{"(*StructType).Pos", Method, 0, ""},
  5229  		{"(*SwitchStmt).End", Method, 0, ""},
  5230  		{"(*SwitchStmt).Pos", Method, 0, ""},
  5231  		{"(*TypeAssertExpr).End", Method, 0, ""},
  5232  		{"(*TypeAssertExpr).Pos", Method, 0, ""},
  5233  		{"(*TypeSpec).End", Method, 0, ""},
  5234  		{"(*TypeSpec).Pos", Method, 0, ""},
  5235  		{"(*TypeSwitchStmt).End", Method, 0, ""},
  5236  		{"(*TypeSwitchStmt).Pos", Method, 0, ""},
  5237  		{"(*UnaryExpr).End", Method, 0, ""},
  5238  		{"(*UnaryExpr).Pos", Method, 0, ""},
  5239  		{"(*ValueSpec).End", Method, 0, ""},
  5240  		{"(*ValueSpec).Pos", Method, 0, ""},
  5241  		{"(CommentMap).Comments", Method, 1, ""},
  5242  		{"(CommentMap).Filter", Method, 1, ""},
  5243  		{"(CommentMap).String", Method, 1, ""},
  5244  		{"(CommentMap).Update", Method, 1, ""},
  5245  		{"(ObjKind).String", Method, 0, ""},
  5246  		{"ArrayType", Type, 0, ""},
  5247  		{"ArrayType.Elt", Field, 0, ""},
  5248  		{"ArrayType.Lbrack", Field, 0, ""},
  5249  		{"ArrayType.Len", Field, 0, ""},
  5250  		{"AssignStmt", Type, 0, ""},
  5251  		{"AssignStmt.Lhs", Field, 0, ""},
  5252  		{"AssignStmt.Rhs", Field, 0, ""},
  5253  		{"AssignStmt.Tok", Field, 0, ""},
  5254  		{"AssignStmt.TokPos", Field, 0, ""},
  5255  		{"Bad", Const, 0, ""},
  5256  		{"BadDecl", Type, 0, ""},
  5257  		{"BadDecl.From", Field, 0, ""},
  5258  		{"BadDecl.To", Field, 0, ""},
  5259  		{"BadExpr", Type, 0, ""},
  5260  		{"BadExpr.From", Field, 0, ""},
  5261  		{"BadExpr.To", Field, 0, ""},
  5262  		{"BadStmt", Type, 0, ""},
  5263  		{"BadStmt.From", Field, 0, ""},
  5264  		{"BadStmt.To", Field, 0, ""},
  5265  		{"BasicLit", Type, 0, ""},
  5266  		{"BasicLit.Kind", Field, 0, ""},
  5267  		{"BasicLit.Value", Field, 0, ""},
  5268  		{"BasicLit.ValuePos", Field, 0, ""},
  5269  		{"BinaryExpr", Type, 0, ""},
  5270  		{"BinaryExpr.Op", Field, 0, ""},
  5271  		{"BinaryExpr.OpPos", Field, 0, ""},
  5272  		{"BinaryExpr.X", Field, 0, ""},
  5273  		{"BinaryExpr.Y", Field, 0, ""},
  5274  		{"BlockStmt", Type, 0, ""},
  5275  		{"BlockStmt.Lbrace", Field, 0, ""},
  5276  		{"BlockStmt.List", Field, 0, ""},
  5277  		{"BlockStmt.Rbrace", Field, 0, ""},
  5278  		{"BranchStmt", Type, 0, ""},
  5279  		{"BranchStmt.Label", Field, 0, ""},
  5280  		{"BranchStmt.Tok", Field, 0, ""},
  5281  		{"BranchStmt.TokPos", Field, 0, ""},
  5282  		{"CallExpr", Type, 0, ""},
  5283  		{"CallExpr.Args", Field, 0, ""},
  5284  		{"CallExpr.Ellipsis", Field, 0, ""},
  5285  		{"CallExpr.Fun", Field, 0, ""},
  5286  		{"CallExpr.Lparen", Field, 0, ""},
  5287  		{"CallExpr.Rparen", Field, 0, ""},
  5288  		{"CaseClause", Type, 0, ""},
  5289  		{"CaseClause.Body", Field, 0, ""},
  5290  		{"CaseClause.Case", Field, 0, ""},
  5291  		{"CaseClause.Colon", Field, 0, ""},
  5292  		{"CaseClause.List", Field, 0, ""},
  5293  		{"ChanDir", Type, 0, ""},
  5294  		{"ChanType", Type, 0, ""},
  5295  		{"ChanType.Arrow", Field, 1, ""},
  5296  		{"ChanType.Begin", Field, 0, ""},
  5297  		{"ChanType.Dir", Field, 0, ""},
  5298  		{"ChanType.Value", Field, 0, ""},
  5299  		{"CommClause", Type, 0, ""},
  5300  		{"CommClause.Body", Field, 0, ""},
  5301  		{"CommClause.Case", Field, 0, ""},
  5302  		{"CommClause.Colon", Field, 0, ""},
  5303  		{"CommClause.Comm", Field, 0, ""},
  5304  		{"Comment", Type, 0, ""},
  5305  		{"Comment.Slash", Field, 0, ""},
  5306  		{"Comment.Text", Field, 0, ""},
  5307  		{"CommentGroup", Type, 0, ""},
  5308  		{"CommentGroup.List", Field, 0, ""},
  5309  		{"CommentMap", Type, 1, ""},
  5310  		{"CompositeLit", Type, 0, ""},
  5311  		{"CompositeLit.Elts", Field, 0, ""},
  5312  		{"CompositeLit.Incomplete", Field, 11, ""},
  5313  		{"CompositeLit.Lbrace", Field, 0, ""},
  5314  		{"CompositeLit.Rbrace", Field, 0, ""},
  5315  		{"CompositeLit.Type", Field, 0, ""},
  5316  		{"Con", Const, 0, ""},
  5317  		{"Decl", Type, 0, ""},
  5318  		{"DeclStmt", Type, 0, ""},
  5319  		{"DeclStmt.Decl", Field, 0, ""},
  5320  		{"DeferStmt", Type, 0, ""},
  5321  		{"DeferStmt.Call", Field, 0, ""},
  5322  		{"DeferStmt.Defer", Field, 0, ""},
  5323  		{"Ellipsis", Type, 0, ""},
  5324  		{"Ellipsis.Ellipsis", Field, 0, ""},
  5325  		{"Ellipsis.Elt", Field, 0, ""},
  5326  		{"EmptyStmt", Type, 0, ""},
  5327  		{"EmptyStmt.Implicit", Field, 5, ""},
  5328  		{"EmptyStmt.Semicolon", Field, 0, ""},
  5329  		{"Expr", Type, 0, ""},
  5330  		{"ExprStmt", Type, 0, ""},
  5331  		{"ExprStmt.X", Field, 0, ""},
  5332  		{"Field", Type, 0, ""},
  5333  		{"Field.Comment", Field, 0, ""},
  5334  		{"Field.Doc", Field, 0, ""},
  5335  		{"Field.Names", Field, 0, ""},
  5336  		{"Field.Tag", Field, 0, ""},
  5337  		{"Field.Type", Field, 0, ""},
  5338  		{"FieldFilter", Type, 0, ""},
  5339  		{"FieldList", Type, 0, ""},
  5340  		{"FieldList.Closing", Field, 0, ""},
  5341  		{"FieldList.List", Field, 0, ""},
  5342  		{"FieldList.Opening", Field, 0, ""},
  5343  		{"File", Type, 0, ""},
  5344  		{"File.Comments", Field, 0, ""},
  5345  		{"File.Decls", Field, 0, ""},
  5346  		{"File.Doc", Field, 0, ""},
  5347  		{"File.FileEnd", Field, 20, ""},
  5348  		{"File.FileStart", Field, 20, ""},
  5349  		{"File.GoVersion", Field, 21, ""},
  5350  		{"File.Imports", Field, 0, ""},
  5351  		{"File.Name", Field, 0, ""},
  5352  		{"File.Package", Field, 0, ""},
  5353  		{"File.Scope", Field, 0, ""},
  5354  		{"File.Unresolved", Field, 0, ""},
  5355  		{"FileExports", Func, 0, "func(src *File) bool"},
  5356  		{"Filter", Type, 0, ""},
  5357  		{"FilterDecl", Func, 0, "func(decl Decl, f Filter) bool"},
  5358  		{"FilterFile", Func, 0, "func(src *File, f Filter) bool"},
  5359  		{"FilterFuncDuplicates", Const, 0, ""},
  5360  		{"FilterImportDuplicates", Const, 0, ""},
  5361  		{"FilterPackage", Func, 0, "func(pkg *Package, f Filter) bool"},
  5362  		{"FilterUnassociatedComments", Const, 0, ""},
  5363  		{"ForStmt", Type, 0, ""},
  5364  		{"ForStmt.Body", Field, 0, ""},
  5365  		{"ForStmt.Cond", Field, 0, ""},
  5366  		{"ForStmt.For", Field, 0, ""},
  5367  		{"ForStmt.Init", Field, 0, ""},
  5368  		{"ForStmt.Post", Field, 0, ""},
  5369  		{"Fprint", Func, 0, "func(w io.Writer, fset *token.FileSet, x any, f FieldFilter) error"},
  5370  		{"Fun", Const, 0, ""},
  5371  		{"FuncDecl", Type, 0, ""},
  5372  		{"FuncDecl.Body", Field, 0, ""},
  5373  		{"FuncDecl.Doc", Field, 0, ""},
  5374  		{"FuncDecl.Name", Field, 0, ""},
  5375  		{"FuncDecl.Recv", Field, 0, ""},
  5376  		{"FuncDecl.Type", Field, 0, ""},
  5377  		{"FuncLit", Type, 0, ""},
  5378  		{"FuncLit.Body", Field, 0, ""},
  5379  		{"FuncLit.Type", Field, 0, ""},
  5380  		{"FuncType", Type, 0, ""},
  5381  		{"FuncType.Func", Field, 0, ""},
  5382  		{"FuncType.Params", Field, 0, ""},
  5383  		{"FuncType.Results", Field, 0, ""},
  5384  		{"FuncType.TypeParams", Field, 18, ""},
  5385  		{"GenDecl", Type, 0, ""},
  5386  		{"GenDecl.Doc", Field, 0, ""},
  5387  		{"GenDecl.Lparen", Field, 0, ""},
  5388  		{"GenDecl.Rparen", Field, 0, ""},
  5389  		{"GenDecl.Specs", Field, 0, ""},
  5390  		{"GenDecl.Tok", Field, 0, ""},
  5391  		{"GenDecl.TokPos", Field, 0, ""},
  5392  		{"GoStmt", Type, 0, ""},
  5393  		{"GoStmt.Call", Field, 0, ""},
  5394  		{"GoStmt.Go", Field, 0, ""},
  5395  		{"Ident", Type, 0, ""},
  5396  		{"Ident.Name", Field, 0, ""},
  5397  		{"Ident.NamePos", Field, 0, ""},
  5398  		{"Ident.Obj", Field, 0, ""},
  5399  		{"IfStmt", Type, 0, ""},
  5400  		{"IfStmt.Body", Field, 0, ""},
  5401  		{"IfStmt.Cond", Field, 0, ""},
  5402  		{"IfStmt.Else", Field, 0, ""},
  5403  		{"IfStmt.If", Field, 0, ""},
  5404  		{"IfStmt.Init", Field, 0, ""},
  5405  		{"ImportSpec", Type, 0, ""},
  5406  		{"ImportSpec.Comment", Field, 0, ""},
  5407  		{"ImportSpec.Doc", Field, 0, ""},
  5408  		{"ImportSpec.EndPos", Field, 0, ""},
  5409  		{"ImportSpec.Name", Field, 0, ""},
  5410  		{"ImportSpec.Path", Field, 0, ""},
  5411  		{"Importer", Type, 0, ""},
  5412  		{"IncDecStmt", Type, 0, ""},
  5413  		{"IncDecStmt.Tok", Field, 0, ""},
  5414  		{"IncDecStmt.TokPos", Field, 0, ""},
  5415  		{"IncDecStmt.X", Field, 0, ""},
  5416  		{"IndexExpr", Type, 0, ""},
  5417  		{"IndexExpr.Index", Field, 0, ""},
  5418  		{"IndexExpr.Lbrack", Field, 0, ""},
  5419  		{"IndexExpr.Rbrack", Field, 0, ""},
  5420  		{"IndexExpr.X", Field, 0, ""},
  5421  		{"IndexListExpr", Type, 18, ""},
  5422  		{"IndexListExpr.Indices", Field, 18, ""},
  5423  		{"IndexListExpr.Lbrack", Field, 18, ""},
  5424  		{"IndexListExpr.Rbrack", Field, 18, ""},
  5425  		{"IndexListExpr.X", Field, 18, ""},
  5426  		{"Inspect", Func, 0, "func(node Node, f func(Node) bool)"},
  5427  		{"InterfaceType", Type, 0, ""},
  5428  		{"InterfaceType.Incomplete", Field, 0, ""},
  5429  		{"InterfaceType.Interface", Field, 0, ""},
  5430  		{"InterfaceType.Methods", Field, 0, ""},
  5431  		{"IsExported", Func, 0, "func(name string) bool"},
  5432  		{"IsGenerated", Func, 21, "func(file *File) bool"},
  5433  		{"KeyValueExpr", Type, 0, ""},
  5434  		{"KeyValueExpr.Colon", Field, 0, ""},
  5435  		{"KeyValueExpr.Key", Field, 0, ""},
  5436  		{"KeyValueExpr.Value", Field, 0, ""},
  5437  		{"LabeledStmt", Type, 0, ""},
  5438  		{"LabeledStmt.Colon", Field, 0, ""},
  5439  		{"LabeledStmt.Label", Field, 0, ""},
  5440  		{"LabeledStmt.Stmt", Field, 0, ""},
  5441  		{"Lbl", Const, 0, ""},
  5442  		{"MapType", Type, 0, ""},
  5443  		{"MapType.Key", Field, 0, ""},
  5444  		{"MapType.Map", Field, 0, ""},
  5445  		{"MapType.Value", Field, 0, ""},
  5446  		{"MergeMode", Type, 0, ""},
  5447  		{"MergePackageFiles", Func, 0, "func(pkg *Package, mode MergeMode) *File"},
  5448  		{"NewCommentMap", Func, 1, "func(fset *token.FileSet, node Node, comments []*CommentGroup) CommentMap"},
  5449  		{"NewIdent", Func, 0, "func(name string) *Ident"},
  5450  		{"NewObj", Func, 0, "func(kind ObjKind, name string) *Object"},
  5451  		{"NewPackage", Func, 0, "func(fset *token.FileSet, files map[string]*File, importer Importer, universe *Scope) (*Package, error)"},
  5452  		{"NewScope", Func, 0, "func(outer *Scope) *Scope"},
  5453  		{"Node", Type, 0, ""},
  5454  		{"NotNilFilter", Func, 0, "func(_ string, v reflect.Value) bool"},
  5455  		{"ObjKind", Type, 0, ""},
  5456  		{"Object", Type, 0, ""},
  5457  		{"Object.Data", Field, 0, ""},
  5458  		{"Object.Decl", Field, 0, ""},
  5459  		{"Object.Kind", Field, 0, ""},
  5460  		{"Object.Name", Field, 0, ""},
  5461  		{"Object.Type", Field, 0, ""},
  5462  		{"Package", Type, 0, ""},
  5463  		{"Package.Files", Field, 0, ""},
  5464  		{"Package.Imports", Field, 0, ""},
  5465  		{"Package.Name", Field, 0, ""},
  5466  		{"Package.Scope", Field, 0, ""},
  5467  		{"PackageExports", Func, 0, "func(pkg *Package) bool"},
  5468  		{"ParenExpr", Type, 0, ""},
  5469  		{"ParenExpr.Lparen", Field, 0, ""},
  5470  		{"ParenExpr.Rparen", Field, 0, ""},
  5471  		{"ParenExpr.X", Field, 0, ""},
  5472  		{"Pkg", Const, 0, ""},
  5473  		{"Preorder", Func, 23, "func(root Node) iter.Seq[Node]"},
  5474  		{"PreorderStack", Func, 25, "func(root Node, stack []Node, f func(n Node, stack []Node) bool)"},
  5475  		{"Print", Func, 0, "func(fset *token.FileSet, x any) error"},
  5476  		{"RECV", Const, 0, ""},
  5477  		{"RangeStmt", Type, 0, ""},
  5478  		{"RangeStmt.Body", Field, 0, ""},
  5479  		{"RangeStmt.For", Field, 0, ""},
  5480  		{"RangeStmt.Key", Field, 0, ""},
  5481  		{"RangeStmt.Range", Field, 20, ""},
  5482  		{"RangeStmt.Tok", Field, 0, ""},
  5483  		{"RangeStmt.TokPos", Field, 0, ""},
  5484  		{"RangeStmt.Value", Field, 0, ""},
  5485  		{"RangeStmt.X", Field, 0, ""},
  5486  		{"ReturnStmt", Type, 0, ""},
  5487  		{"ReturnStmt.Results", Field, 0, ""},
  5488  		{"ReturnStmt.Return", Field, 0, ""},
  5489  		{"SEND", Const, 0, ""},
  5490  		{"Scope", Type, 0, ""},
  5491  		{"Scope.Objects", Field, 0, ""},
  5492  		{"Scope.Outer", Field, 0, ""},
  5493  		{"SelectStmt", Type, 0, ""},
  5494  		{"SelectStmt.Body", Field, 0, ""},
  5495  		{"SelectStmt.Select", Field, 0, ""},
  5496  		{"SelectorExpr", Type, 0, ""},
  5497  		{"SelectorExpr.Sel", Field, 0, ""},
  5498  		{"SelectorExpr.X", Field, 0, ""},
  5499  		{"SendStmt", Type, 0, ""},
  5500  		{"SendStmt.Arrow", Field, 0, ""},
  5501  		{"SendStmt.Chan", Field, 0, ""},
  5502  		{"SendStmt.Value", Field, 0, ""},
  5503  		{"SliceExpr", Type, 0, ""},
  5504  		{"SliceExpr.High", Field, 0, ""},
  5505  		{"SliceExpr.Lbrack", Field, 0, ""},
  5506  		{"SliceExpr.Low", Field, 0, ""},
  5507  		{"SliceExpr.Max", Field, 2, ""},
  5508  		{"SliceExpr.Rbrack", Field, 0, ""},
  5509  		{"SliceExpr.Slice3", Field, 2, ""},
  5510  		{"SliceExpr.X", Field, 0, ""},
  5511  		{"SortImports", Func, 0, "func(fset *token.FileSet, f *File)"},
  5512  		{"Spec", Type, 0, ""},
  5513  		{"StarExpr", Type, 0, ""},
  5514  		{"StarExpr.Star", Field, 0, ""},
  5515  		{"StarExpr.X", Field, 0, ""},
  5516  		{"Stmt", Type, 0, ""},
  5517  		{"StructType", Type, 0, ""},
  5518  		{"StructType.Fields", Field, 0, ""},
  5519  		{"StructType.Incomplete", Field, 0, ""},
  5520  		{"StructType.Struct", Field, 0, ""},
  5521  		{"SwitchStmt", Type, 0, ""},
  5522  		{"SwitchStmt.Body", Field, 0, ""},
  5523  		{"SwitchStmt.Init", Field, 0, ""},
  5524  		{"SwitchStmt.Switch", Field, 0, ""},
  5525  		{"SwitchStmt.Tag", Field, 0, ""},
  5526  		{"Typ", Const, 0, ""},
  5527  		{"TypeAssertExpr", Type, 0, ""},
  5528  		{"TypeAssertExpr.Lparen", Field, 2, ""},
  5529  		{"TypeAssertExpr.Rparen", Field, 2, ""},
  5530  		{"TypeAssertExpr.Type", Field, 0, ""},
  5531  		{"TypeAssertExpr.X", Field, 0, ""},
  5532  		{"TypeSpec", Type, 0, ""},
  5533  		{"TypeSpec.Assign", Field, 9, ""},
  5534  		{"TypeSpec.Comment", Field, 0, ""},
  5535  		{"TypeSpec.Doc", Field, 0, ""},
  5536  		{"TypeSpec.Name", Field, 0, ""},
  5537  		{"TypeSpec.Type", Field, 0, ""},
  5538  		{"TypeSpec.TypeParams", Field, 18, ""},
  5539  		{"TypeSwitchStmt", Type, 0, ""},
  5540  		{"TypeSwitchStmt.Assign", Field, 0, ""},
  5541  		{"TypeSwitchStmt.Body", Field, 0, ""},
  5542  		{"TypeSwitchStmt.Init", Field, 0, ""},
  5543  		{"TypeSwitchStmt.Switch", Field, 0, ""},
  5544  		{"UnaryExpr", Type, 0, ""},
  5545  		{"UnaryExpr.Op", Field, 0, ""},
  5546  		{"UnaryExpr.OpPos", Field, 0, ""},
  5547  		{"UnaryExpr.X", Field, 0, ""},
  5548  		{"Unparen", Func, 22, "func(e Expr) Expr"},
  5549  		{"ValueSpec", Type, 0, ""},
  5550  		{"ValueSpec.Comment", Field, 0, ""},
  5551  		{"ValueSpec.Doc", Field, 0, ""},
  5552  		{"ValueSpec.Names", Field, 0, ""},
  5553  		{"ValueSpec.Type", Field, 0, ""},
  5554  		{"ValueSpec.Values", Field, 0, ""},
  5555  		{"Var", Const, 0, ""},
  5556  		{"Visitor", Type, 0, ""},
  5557  		{"Walk", Func, 0, "func(v Visitor, node Node)"},
  5558  	},
  5559  	"go/build": {
  5560  		{"(*Context).Import", Method, 0, ""},
  5561  		{"(*Context).ImportDir", Method, 0, ""},
  5562  		{"(*Context).MatchFile", Method, 2, ""},
  5563  		{"(*Context).SrcDirs", Method, 0, ""},
  5564  		{"(*MultiplePackageError).Error", Method, 4, ""},
  5565  		{"(*NoGoError).Error", Method, 0, ""},
  5566  		{"(*Package).IsCommand", Method, 0, ""},
  5567  		{"AllowBinary", Const, 0, ""},
  5568  		{"ArchChar", Func, 0, "func(goarch string) (string, error)"},
  5569  		{"Context", Type, 0, ""},
  5570  		{"Context.BuildTags", Field, 0, ""},
  5571  		{"Context.CgoEnabled", Field, 0, ""},
  5572  		{"Context.Compiler", Field, 0, ""},
  5573  		{"Context.Dir", Field, 14, ""},
  5574  		{"Context.GOARCH", Field, 0, ""},
  5575  		{"Context.GOOS", Field, 0, ""},
  5576  		{"Context.GOPATH", Field, 0, ""},
  5577  		{"Context.GOROOT", Field, 0, ""},
  5578  		{"Context.HasSubdir", Field, 0, ""},
  5579  		{"Context.InstallSuffix", Field, 1, ""},
  5580  		{"Context.IsAbsPath", Field, 0, ""},
  5581  		{"Context.IsDir", Field, 0, ""},
  5582  		{"Context.JoinPath", Field, 0, ""},
  5583  		{"Context.OpenFile", Field, 0, ""},
  5584  		{"Context.ReadDir", Field, 0, ""},
  5585  		{"Context.ReleaseTags", Field, 1, ""},
  5586  		{"Context.SplitPathList", Field, 0, ""},
  5587  		{"Context.ToolTags", Field, 17, ""},
  5588  		{"Context.UseAllFiles", Field, 0, ""},
  5589  		{"Default", Var, 0, ""},
  5590  		{"Directive", Type, 21, ""},
  5591  		{"Directive.Pos", Field, 21, ""},
  5592  		{"Directive.Text", Field, 21, ""},
  5593  		{"FindOnly", Const, 0, ""},
  5594  		{"IgnoreVendor", Const, 6, ""},
  5595  		{"Import", Func, 0, "func(path string, srcDir string, mode ImportMode) (*Package, error)"},
  5596  		{"ImportComment", Const, 4, ""},
  5597  		{"ImportDir", Func, 0, "func(dir string, mode ImportMode) (*Package, error)"},
  5598  		{"ImportMode", Type, 0, ""},
  5599  		{"IsLocalImport", Func, 0, "func(path string) bool"},
  5600  		{"MultiplePackageError", Type, 4, ""},
  5601  		{"MultiplePackageError.Dir", Field, 4, ""},
  5602  		{"MultiplePackageError.Files", Field, 4, ""},
  5603  		{"MultiplePackageError.Packages", Field, 4, ""},
  5604  		{"NoGoError", Type, 0, ""},
  5605  		{"NoGoError.Dir", Field, 0, ""},
  5606  		{"Package", Type, 0, ""},
  5607  		{"Package.AllTags", Field, 2, ""},
  5608  		{"Package.BinDir", Field, 0, ""},
  5609  		{"Package.BinaryOnly", Field, 7, ""},
  5610  		{"Package.CFiles", Field, 0, ""},
  5611  		{"Package.CXXFiles", Field, 2, ""},
  5612  		{"Package.CgoCFLAGS", Field, 0, ""},
  5613  		{"Package.CgoCPPFLAGS", Field, 2, ""},
  5614  		{"Package.CgoCXXFLAGS", Field, 2, ""},
  5615  		{"Package.CgoFFLAGS", Field, 7, ""},
  5616  		{"Package.CgoFiles", Field, 0, ""},
  5617  		{"Package.CgoLDFLAGS", Field, 0, ""},
  5618  		{"Package.CgoPkgConfig", Field, 0, ""},
  5619  		{"Package.ConflictDir", Field, 2, ""},
  5620  		{"Package.Dir", Field, 0, ""},
  5621  		{"Package.Directives", Field, 21, ""},
  5622  		{"Package.Doc", Field, 0, ""},
  5623  		{"Package.EmbedPatternPos", Field, 16, ""},
  5624  		{"Package.EmbedPatterns", Field, 16, ""},
  5625  		{"Package.FFiles", Field, 7, ""},
  5626  		{"Package.GoFiles", Field, 0, ""},
  5627  		{"Package.Goroot", Field, 0, ""},
  5628  		{"Package.HFiles", Field, 0, ""},
  5629  		{"Package.IgnoredGoFiles", Field, 1, ""},
  5630  		{"Package.IgnoredOtherFiles", Field, 16, ""},
  5631  		{"Package.ImportComment", Field, 4, ""},
  5632  		{"Package.ImportPath", Field, 0, ""},
  5633  		{"Package.ImportPos", Field, 0, ""},
  5634  		{"Package.Imports", Field, 0, ""},
  5635  		{"Package.InvalidGoFiles", Field, 6, ""},
  5636  		{"Package.MFiles", Field, 3, ""},
  5637  		{"Package.Name", Field, 0, ""},
  5638  		{"Package.PkgObj", Field, 0, ""},
  5639  		{"Package.PkgRoot", Field, 0, ""},
  5640  		{"Package.PkgTargetRoot", Field, 5, ""},
  5641  		{"Package.Root", Field, 0, ""},
  5642  		{"Package.SFiles", Field, 0, ""},
  5643  		{"Package.SrcRoot", Field, 0, ""},
  5644  		{"Package.SwigCXXFiles", Field, 1, ""},
  5645  		{"Package.SwigFiles", Field, 1, ""},
  5646  		{"Package.SysoFiles", Field, 0, ""},
  5647  		{"Package.TestDirectives", Field, 21, ""},
  5648  		{"Package.TestEmbedPatternPos", Field, 16, ""},
  5649  		{"Package.TestEmbedPatterns", Field, 16, ""},
  5650  		{"Package.TestGoFiles", Field, 0, ""},
  5651  		{"Package.TestImportPos", Field, 0, ""},
  5652  		{"Package.TestImports", Field, 0, ""},
  5653  		{"Package.XTestDirectives", Field, 21, ""},
  5654  		{"Package.XTestEmbedPatternPos", Field, 16, ""},
  5655  		{"Package.XTestEmbedPatterns", Field, 16, ""},
  5656  		{"Package.XTestGoFiles", Field, 0, ""},
  5657  		{"Package.XTestImportPos", Field, 0, ""},
  5658  		{"Package.XTestImports", Field, 0, ""},
  5659  		{"ToolDir", Var, 0, ""},
  5660  	},
  5661  	"go/build/constraint": {
  5662  		{"(*AndExpr).Eval", Method, 16, ""},
  5663  		{"(*AndExpr).String", Method, 16, ""},
  5664  		{"(*NotExpr).Eval", Method, 16, ""},
  5665  		{"(*NotExpr).String", Method, 16, ""},
  5666  		{"(*OrExpr).Eval", Method, 16, ""},
  5667  		{"(*OrExpr).String", Method, 16, ""},
  5668  		{"(*SyntaxError).Error", Method, 16, ""},
  5669  		{"(*TagExpr).Eval", Method, 16, ""},
  5670  		{"(*TagExpr).String", Method, 16, ""},
  5671  		{"AndExpr", Type, 16, ""},
  5672  		{"AndExpr.X", Field, 16, ""},
  5673  		{"AndExpr.Y", Field, 16, ""},
  5674  		{"Expr", Type, 16, ""},
  5675  		{"GoVersion", Func, 21, "func(x Expr) string"},
  5676  		{"IsGoBuild", Func, 16, "func(line string) bool"},
  5677  		{"IsPlusBuild", Func, 16, "func(line string) bool"},
  5678  		{"NotExpr", Type, 16, ""},
  5679  		{"NotExpr.X", Field, 16, ""},
  5680  		{"OrExpr", Type, 16, ""},
  5681  		{"OrExpr.X", Field, 16, ""},
  5682  		{"OrExpr.Y", Field, 16, ""},
  5683  		{"Parse", Func, 16, "func(line string) (Expr, error)"},
  5684  		{"PlusBuildLines", Func, 16, "func(x Expr) ([]string, error)"},
  5685  		{"SyntaxError", Type, 16, ""},
  5686  		{"SyntaxError.Err", Field, 16, ""},
  5687  		{"SyntaxError.Offset", Field, 16, ""},
  5688  		{"TagExpr", Type, 16, ""},
  5689  		{"TagExpr.Tag", Field, 16, ""},
  5690  	},
  5691  	"go/constant": {
  5692  		{"(Kind).String", Method, 18, ""},
  5693  		{"BinaryOp", Func, 5, "func(x_ Value, op token.Token, y_ Value) Value"},
  5694  		{"BitLen", Func, 5, "func(x Value) int"},
  5695  		{"Bool", Const, 5, ""},
  5696  		{"BoolVal", Func, 5, "func(x Value) bool"},
  5697  		{"Bytes", Func, 5, "func(x Value) []byte"},
  5698  		{"Compare", Func, 5, "func(x_ Value, op token.Token, y_ Value) bool"},
  5699  		{"Complex", Const, 5, ""},
  5700  		{"Denom", Func, 5, "func(x Value) Value"},
  5701  		{"Float", Const, 5, ""},
  5702  		{"Float32Val", Func, 5, "func(x Value) (float32, bool)"},
  5703  		{"Float64Val", Func, 5, "func(x Value) (float64, bool)"},
  5704  		{"Imag", Func, 5, "func(x Value) Value"},
  5705  		{"Int", Const, 5, ""},
  5706  		{"Int64Val", Func, 5, "func(x Value) (int64, bool)"},
  5707  		{"Kind", Type, 5, ""},
  5708  		{"Make", Func, 13, "func(x any) Value"},
  5709  		{"MakeBool", Func, 5, "func(b bool) Value"},
  5710  		{"MakeFloat64", Func, 5, "func(x float64) Value"},
  5711  		{"MakeFromBytes", Func, 5, "func(bytes []byte) Value"},
  5712  		{"MakeFromLiteral", Func, 5, "func(lit string, tok token.Token, zero uint) Value"},
  5713  		{"MakeImag", Func, 5, "func(x Value) Value"},
  5714  		{"MakeInt64", Func, 5, "func(x int64) Value"},
  5715  		{"MakeString", Func, 5, "func(s string) Value"},
  5716  		{"MakeUint64", Func, 5, "func(x uint64) Value"},
  5717  		{"MakeUnknown", Func, 5, "func() Value"},
  5718  		{"Num", Func, 5, "func(x Value) Value"},
  5719  		{"Real", Func, 5, "func(x Value) Value"},
  5720  		{"Shift", Func, 5, "func(x Value, op token.Token, s uint) Value"},
  5721  		{"Sign", Func, 5, "func(x Value) int"},
  5722  		{"String", Const, 5, ""},
  5723  		{"StringVal", Func, 5, "func(x Value) string"},
  5724  		{"ToComplex", Func, 6, "func(x Value) Value"},
  5725  		{"ToFloat", Func, 6, "func(x Value) Value"},
  5726  		{"ToInt", Func, 6, "func(x Value) Value"},
  5727  		{"Uint64Val", Func, 5, "func(x Value) (uint64, bool)"},
  5728  		{"UnaryOp", Func, 5, "func(op token.Token, y Value, prec uint) Value"},
  5729  		{"Unknown", Const, 5, ""},
  5730  		{"Val", Func, 13, "func(x Value) any"},
  5731  		{"Value", Type, 5, ""},
  5732  	},
  5733  	"go/doc": {
  5734  		{"(*Package).Filter", Method, 0, ""},
  5735  		{"(*Package).HTML", Method, 19, ""},
  5736  		{"(*Package).Markdown", Method, 19, ""},
  5737  		{"(*Package).Parser", Method, 19, ""},
  5738  		{"(*Package).Printer", Method, 19, ""},
  5739  		{"(*Package).Synopsis", Method, 19, ""},
  5740  		{"(*Package).Text", Method, 19, ""},
  5741  		{"AllDecls", Const, 0, ""},
  5742  		{"AllMethods", Const, 0, ""},
  5743  		{"Example", Type, 0, ""},
  5744  		{"Example.Code", Field, 0, ""},
  5745  		{"Example.Comments", Field, 0, ""},
  5746  		{"Example.Doc", Field, 0, ""},
  5747  		{"Example.EmptyOutput", Field, 1, ""},
  5748  		{"Example.Name", Field, 0, ""},
  5749  		{"Example.Order", Field, 1, ""},
  5750  		{"Example.Output", Field, 0, ""},
  5751  		{"Example.Play", Field, 1, ""},
  5752  		{"Example.Suffix", Field, 14, ""},
  5753  		{"Example.Unordered", Field, 7, ""},
  5754  		{"Examples", Func, 0, "func(testFiles ...*ast.File) []*Example"},
  5755  		{"Filter", Type, 0, ""},
  5756  		{"Func", Type, 0, ""},
  5757  		{"Func.Decl", Field, 0, ""},
  5758  		{"Func.Doc", Field, 0, ""},
  5759  		{"Func.Examples", Field, 14, ""},
  5760  		{"Func.Level", Field, 0, ""},
  5761  		{"Func.Name", Field, 0, ""},
  5762  		{"Func.Orig", Field, 0, ""},
  5763  		{"Func.Recv", Field, 0, ""},
  5764  		{"IllegalPrefixes", Var, 1, ""},
  5765  		{"IsPredeclared", Func, 8, "func(s string) bool"},
  5766  		{"Mode", Type, 0, ""},
  5767  		{"New", Func, 0, "func(pkg *ast.Package, importPath string, mode Mode) *Package"},
  5768  		{"NewFromFiles", Func, 14, "func(fset *token.FileSet, files []*ast.File, importPath string, opts ...any) (*Package, error)"},
  5769  		{"Note", Type, 1, ""},
  5770  		{"Note.Body", Field, 1, ""},
  5771  		{"Note.End", Field, 1, ""},
  5772  		{"Note.Pos", Field, 1, ""},
  5773  		{"Note.UID", Field, 1, ""},
  5774  		{"Package", Type, 0, ""},
  5775  		{"Package.Bugs", Field, 0, ""},
  5776  		{"Package.Consts", Field, 0, ""},
  5777  		{"Package.Doc", Field, 0, ""},
  5778  		{"Package.Examples", Field, 14, ""},
  5779  		{"Package.Filenames", Field, 0, ""},
  5780  		{"Package.Funcs", Field, 0, ""},
  5781  		{"Package.ImportPath", Field, 0, ""},
  5782  		{"Package.Imports", Field, 0, ""},
  5783  		{"Package.Name", Field, 0, ""},
  5784  		{"Package.Notes", Field, 1, ""},
  5785  		{"Package.Types", Field, 0, ""},
  5786  		{"Package.Vars", Field, 0, ""},
  5787  		{"PreserveAST", Const, 12, ""},
  5788  		{"Synopsis", Func, 0, "func(text string) string"},
  5789  		{"ToHTML", Func, 0, "func(w io.Writer, text string, words map[string]string)"},
  5790  		{"ToText", Func, 0, "func(w io.Writer, text string, prefix string, codePrefix string, width int)"},
  5791  		{"Type", Type, 0, ""},
  5792  		{"Type.Consts", Field, 0, ""},
  5793  		{"Type.Decl", Field, 0, ""},
  5794  		{"Type.Doc", Field, 0, ""},
  5795  		{"Type.Examples", Field, 14, ""},
  5796  		{"Type.Funcs", Field, 0, ""},
  5797  		{"Type.Methods", Field, 0, ""},
  5798  		{"Type.Name", Field, 0, ""},
  5799  		{"Type.Vars", Field, 0, ""},
  5800  		{"Value", Type, 0, ""},
  5801  		{"Value.Decl", Field, 0, ""},
  5802  		{"Value.Doc", Field, 0, ""},
  5803  		{"Value.Names", Field, 0, ""},
  5804  	},
  5805  	"go/doc/comment": {
  5806  		{"(*DocLink).DefaultURL", Method, 19, ""},
  5807  		{"(*Heading).DefaultID", Method, 19, ""},
  5808  		{"(*List).BlankBefore", Method, 19, ""},
  5809  		{"(*List).BlankBetween", Method, 19, ""},
  5810  		{"(*Parser).Parse", Method, 19, ""},
  5811  		{"(*Printer).Comment", Method, 19, ""},
  5812  		{"(*Printer).HTML", Method, 19, ""},
  5813  		{"(*Printer).Markdown", Method, 19, ""},
  5814  		{"(*Printer).Text", Method, 19, ""},
  5815  		{"Block", Type, 19, ""},
  5816  		{"Code", Type, 19, ""},
  5817  		{"Code.Text", Field, 19, ""},
  5818  		{"DefaultLookupPackage", Func, 19, "func(name string) (importPath string, ok bool)"},
  5819  		{"Doc", Type, 19, ""},
  5820  		{"Doc.Content", Field, 19, ""},
  5821  		{"Doc.Links", Field, 19, ""},
  5822  		{"DocLink", Type, 19, ""},
  5823  		{"DocLink.ImportPath", Field, 19, ""},
  5824  		{"DocLink.Name", Field, 19, ""},
  5825  		{"DocLink.Recv", Field, 19, ""},
  5826  		{"DocLink.Text", Field, 19, ""},
  5827  		{"Heading", Type, 19, ""},
  5828  		{"Heading.Text", Field, 19, ""},
  5829  		{"Italic", Type, 19, ""},
  5830  		{"Link", Type, 19, ""},
  5831  		{"Link.Auto", Field, 19, ""},
  5832  		{"Link.Text", Field, 19, ""},
  5833  		{"Link.URL", Field, 19, ""},
  5834  		{"LinkDef", Type, 19, ""},
  5835  		{"LinkDef.Text", Field, 19, ""},
  5836  		{"LinkDef.URL", Field, 19, ""},
  5837  		{"LinkDef.Used", Field, 19, ""},
  5838  		{"List", Type, 19, ""},
  5839  		{"List.ForceBlankBefore", Field, 19, ""},
  5840  		{"List.ForceBlankBetween", Field, 19, ""},
  5841  		{"List.Items", Field, 19, ""},
  5842  		{"ListItem", Type, 19, ""},
  5843  		{"ListItem.Content", Field, 19, ""},
  5844  		{"ListItem.Number", Field, 19, ""},
  5845  		{"Paragraph", Type, 19, ""},
  5846  		{"Paragraph.Text", Field, 19, ""},
  5847  		{"Parser", Type, 19, ""},
  5848  		{"Parser.LookupPackage", Field, 19, ""},
  5849  		{"Parser.LookupSym", Field, 19, ""},
  5850  		{"Parser.Words", Field, 19, ""},
  5851  		{"Plain", Type, 19, ""},
  5852  		{"Printer", Type, 19, ""},
  5853  		{"Printer.DocLinkBaseURL", Field, 19, ""},
  5854  		{"Printer.DocLinkURL", Field, 19, ""},
  5855  		{"Printer.HeadingID", Field, 19, ""},
  5856  		{"Printer.HeadingLevel", Field, 19, ""},
  5857  		{"Printer.TextCodePrefix", Field, 19, ""},
  5858  		{"Printer.TextPrefix", Field, 19, ""},
  5859  		{"Printer.TextWidth", Field, 19, ""},
  5860  		{"Text", Type, 19, ""},
  5861  	},
  5862  	"go/format": {
  5863  		{"Node", Func, 1, "func(dst io.Writer, fset *token.FileSet, node any) error"},
  5864  		{"Source", Func, 1, "func(src []byte) ([]byte, error)"},
  5865  	},
  5866  	"go/importer": {
  5867  		{"Default", Func, 5, "func() types.Importer"},
  5868  		{"For", Func, 5, "func(compiler string, lookup Lookup) types.Importer"},
  5869  		{"ForCompiler", Func, 12, "func(fset *token.FileSet, compiler string, lookup Lookup) types.Importer"},
  5870  		{"Lookup", Type, 5, ""},
  5871  	},
  5872  	"go/parser": {
  5873  		{"AllErrors", Const, 1, ""},
  5874  		{"DeclarationErrors", Const, 0, ""},
  5875  		{"ImportsOnly", Const, 0, ""},
  5876  		{"Mode", Type, 0, ""},
  5877  		{"PackageClauseOnly", Const, 0, ""},
  5878  		{"ParseComments", Const, 0, ""},
  5879  		{"ParseDir", Func, 0, "func(fset *token.FileSet, path string, filter func(fs.FileInfo) bool, mode Mode) (pkgs map[string]*ast.Package, first error)"},
  5880  		{"ParseExpr", Func, 0, "func(x string) (ast.Expr, error)"},
  5881  		{"ParseExprFrom", Func, 5, "func(fset *token.FileSet, filename string, src any, mode Mode) (expr ast.Expr, err error)"},
  5882  		{"ParseFile", Func, 0, "func(fset *token.FileSet, filename string, src any, mode Mode) (f *ast.File, err error)"},
  5883  		{"SkipObjectResolution", Const, 17, ""},
  5884  		{"SpuriousErrors", Const, 0, ""},
  5885  		{"Trace", Const, 0, ""},
  5886  	},
  5887  	"go/printer": {
  5888  		{"(*Config).Fprint", Method, 0, ""},
  5889  		{"CommentedNode", Type, 0, ""},
  5890  		{"CommentedNode.Comments", Field, 0, ""},
  5891  		{"CommentedNode.Node", Field, 0, ""},
  5892  		{"Config", Type, 0, ""},
  5893  		{"Config.Indent", Field, 1, ""},
  5894  		{"Config.Mode", Field, 0, ""},
  5895  		{"Config.Tabwidth", Field, 0, ""},
  5896  		{"Fprint", Func, 0, "func(output io.Writer, fset *token.FileSet, node any) error"},
  5897  		{"Mode", Type, 0, ""},
  5898  		{"RawFormat", Const, 0, ""},
  5899  		{"SourcePos", Const, 0, ""},
  5900  		{"TabIndent", Const, 0, ""},
  5901  		{"UseSpaces", Const, 0, ""},
  5902  	},
  5903  	"go/scanner": {
  5904  		{"(*ErrorList).Add", Method, 0, ""},
  5905  		{"(*ErrorList).RemoveMultiples", Method, 0, ""},
  5906  		{"(*ErrorList).Reset", Method, 0, ""},
  5907  		{"(*Scanner).Init", Method, 0, ""},
  5908  		{"(*Scanner).Scan", Method, 0, ""},
  5909  		{"(Error).Error", Method, 0, ""},
  5910  		{"(ErrorList).Err", Method, 0, ""},
  5911  		{"(ErrorList).Error", Method, 0, ""},
  5912  		{"(ErrorList).Len", Method, 0, ""},
  5913  		{"(ErrorList).Less", Method, 0, ""},
  5914  		{"(ErrorList).Sort", Method, 0, ""},
  5915  		{"(ErrorList).Swap", Method, 0, ""},
  5916  		{"Error", Type, 0, ""},
  5917  		{"Error.Msg", Field, 0, ""},
  5918  		{"Error.Pos", Field, 0, ""},
  5919  		{"ErrorHandler", Type, 0, ""},
  5920  		{"ErrorList", Type, 0, ""},
  5921  		{"Mode", Type, 0, ""},
  5922  		{"PrintError", Func, 0, "func(w io.Writer, err error)"},
  5923  		{"ScanComments", Const, 0, ""},
  5924  		{"Scanner", Type, 0, ""},
  5925  		{"Scanner.ErrorCount", Field, 0, ""},
  5926  	},
  5927  	"go/token": {
  5928  		{"(*File).AddLine", Method, 0, ""},
  5929  		{"(*File).AddLineColumnInfo", Method, 11, ""},
  5930  		{"(*File).AddLineInfo", Method, 0, ""},
  5931  		{"(*File).Base", Method, 0, ""},
  5932  		{"(*File).Line", Method, 0, ""},
  5933  		{"(*File).LineCount", Method, 0, ""},
  5934  		{"(*File).LineStart", Method, 12, ""},
  5935  		{"(*File).Lines", Method, 21, ""},
  5936  		{"(*File).MergeLine", Method, 2, ""},
  5937  		{"(*File).Name", Method, 0, ""},
  5938  		{"(*File).Offset", Method, 0, ""},
  5939  		{"(*File).Pos", Method, 0, ""},
  5940  		{"(*File).Position", Method, 0, ""},
  5941  		{"(*File).PositionFor", Method, 4, ""},
  5942  		{"(*File).SetLines", Method, 0, ""},
  5943  		{"(*File).SetLinesForContent", Method, 0, ""},
  5944  		{"(*File).Size", Method, 0, ""},
  5945  		{"(*FileSet).AddExistingFiles", Method, 25, ""},
  5946  		{"(*FileSet).AddFile", Method, 0, ""},
  5947  		{"(*FileSet).Base", Method, 0, ""},
  5948  		{"(*FileSet).File", Method, 0, ""},
  5949  		{"(*FileSet).Iterate", Method, 0, ""},
  5950  		{"(*FileSet).Position", Method, 0, ""},
  5951  		{"(*FileSet).PositionFor", Method, 4, ""},
  5952  		{"(*FileSet).Read", Method, 0, ""},
  5953  		{"(*FileSet).RemoveFile", Method, 20, ""},
  5954  		{"(*FileSet).Write", Method, 0, ""},
  5955  		{"(*Position).IsValid", Method, 0, ""},
  5956  		{"(Pos).IsValid", Method, 0, ""},
  5957  		{"(Position).String", Method, 0, ""},
  5958  		{"(Token).IsKeyword", Method, 0, ""},
  5959  		{"(Token).IsLiteral", Method, 0, ""},
  5960  		{"(Token).IsOperator", Method, 0, ""},
  5961  		{"(Token).Precedence", Method, 0, ""},
  5962  		{"(Token).String", Method, 0, ""},
  5963  		{"ADD", Const, 0, ""},
  5964  		{"ADD_ASSIGN", Const, 0, ""},
  5965  		{"AND", Const, 0, ""},
  5966  		{"AND_ASSIGN", Const, 0, ""},
  5967  		{"AND_NOT", Const, 0, ""},
  5968  		{"AND_NOT_ASSIGN", Const, 0, ""},
  5969  		{"ARROW", Const, 0, ""},
  5970  		{"ASSIGN", Const, 0, ""},
  5971  		{"BREAK", Const, 0, ""},
  5972  		{"CASE", Const, 0, ""},
  5973  		{"CHAN", Const, 0, ""},
  5974  		{"CHAR", Const, 0, ""},
  5975  		{"COLON", Const, 0, ""},
  5976  		{"COMMA", Const, 0, ""},
  5977  		{"COMMENT", Const, 0, ""},
  5978  		{"CONST", Const, 0, ""},
  5979  		{"CONTINUE", Const, 0, ""},
  5980  		{"DEC", Const, 0, ""},
  5981  		{"DEFAULT", Const, 0, ""},
  5982  		{"DEFER", Const, 0, ""},
  5983  		{"DEFINE", Const, 0, ""},
  5984  		{"ELLIPSIS", Const, 0, ""},
  5985  		{"ELSE", Const, 0, ""},
  5986  		{"EOF", Const, 0, ""},
  5987  		{"EQL", Const, 0, ""},
  5988  		{"FALLTHROUGH", Const, 0, ""},
  5989  		{"FLOAT", Const, 0, ""},
  5990  		{"FOR", Const, 0, ""},
  5991  		{"FUNC", Const, 0, ""},
  5992  		{"File", Type, 0, ""},
  5993  		{"FileSet", Type, 0, ""},
  5994  		{"GEQ", Const, 0, ""},
  5995  		{"GO", Const, 0, ""},
  5996  		{"GOTO", Const, 0, ""},
  5997  		{"GTR", Const, 0, ""},
  5998  		{"HighestPrec", Const, 0, ""},
  5999  		{"IDENT", Const, 0, ""},
  6000  		{"IF", Const, 0, ""},
  6001  		{"ILLEGAL", Const, 0, ""},
  6002  		{"IMAG", Const, 0, ""},
  6003  		{"IMPORT", Const, 0, ""},
  6004  		{"INC", Const, 0, ""},
  6005  		{"INT", Const, 0, ""},
  6006  		{"INTERFACE", Const, 0, ""},
  6007  		{"IsExported", Func, 13, "func(name string) bool"},
  6008  		{"IsIdentifier", Func, 13, "func(name string) bool"},
  6009  		{"IsKeyword", Func, 13, "func(name string) bool"},
  6010  		{"LAND", Const, 0, ""},
  6011  		{"LBRACE", Const, 0, ""},
  6012  		{"LBRACK", Const, 0, ""},
  6013  		{"LEQ", Const, 0, ""},
  6014  		{"LOR", Const, 0, ""},
  6015  		{"LPAREN", Const, 0, ""},
  6016  		{"LSS", Const, 0, ""},
  6017  		{"Lookup", Func, 0, "func(ident string) Token"},
  6018  		{"LowestPrec", Const, 0, ""},
  6019  		{"MAP", Const, 0, ""},
  6020  		{"MUL", Const, 0, ""},
  6021  		{"MUL_ASSIGN", Const, 0, ""},
  6022  		{"NEQ", Const, 0, ""},
  6023  		{"NOT", Const, 0, ""},
  6024  		{"NewFileSet", Func, 0, "func() *FileSet"},
  6025  		{"NoPos", Const, 0, ""},
  6026  		{"OR", Const, 0, ""},
  6027  		{"OR_ASSIGN", Const, 0, ""},
  6028  		{"PACKAGE", Const, 0, ""},
  6029  		{"PERIOD", Const, 0, ""},
  6030  		{"Pos", Type, 0, ""},
  6031  		{"Position", Type, 0, ""},
  6032  		{"Position.Column", Field, 0, ""},
  6033  		{"Position.Filename", Field, 0, ""},
  6034  		{"Position.Line", Field, 0, ""},
  6035  		{"Position.Offset", Field, 0, ""},
  6036  		{"QUO", Const, 0, ""},
  6037  		{"QUO_ASSIGN", Const, 0, ""},
  6038  		{"RANGE", Const, 0, ""},
  6039  		{"RBRACE", Const, 0, ""},
  6040  		{"RBRACK", Const, 0, ""},
  6041  		{"REM", Const, 0, ""},
  6042  		{"REM_ASSIGN", Const, 0, ""},
  6043  		{"RETURN", Const, 0, ""},
  6044  		{"RPAREN", Const, 0, ""},
  6045  		{"SELECT", Const, 0, ""},
  6046  		{"SEMICOLON", Const, 0, ""},
  6047  		{"SHL", Const, 0, ""},
  6048  		{"SHL_ASSIGN", Const, 0, ""},
  6049  		{"SHR", Const, 0, ""},
  6050  		{"SHR_ASSIGN", Const, 0, ""},
  6051  		{"STRING", Const, 0, ""},
  6052  		{"STRUCT", Const, 0, ""},
  6053  		{"SUB", Const, 0, ""},
  6054  		{"SUB_ASSIGN", Const, 0, ""},
  6055  		{"SWITCH", Const, 0, ""},
  6056  		{"TILDE", Const, 18, ""},
  6057  		{"TYPE", Const, 0, ""},
  6058  		{"Token", Type, 0, ""},
  6059  		{"UnaryPrec", Const, 0, ""},
  6060  		{"VAR", Const, 0, ""},
  6061  		{"XOR", Const, 0, ""},
  6062  		{"XOR_ASSIGN", Const, 0, ""},
  6063  	},
  6064  	"go/types": {
  6065  		{"(*Alias).Obj", Method, 22, ""},
  6066  		{"(*Alias).Origin", Method, 23, ""},
  6067  		{"(*Alias).Rhs", Method, 23, ""},
  6068  		{"(*Alias).SetTypeParams", Method, 23, ""},
  6069  		{"(*Alias).String", Method, 22, ""},
  6070  		{"(*Alias).TypeArgs", Method, 23, ""},
  6071  		{"(*Alias).TypeParams", Method, 23, ""},
  6072  		{"(*Alias).Underlying", Method, 22, ""},
  6073  		{"(*ArgumentError).Error", Method, 18, ""},
  6074  		{"(*ArgumentError).Unwrap", Method, 18, ""},
  6075  		{"(*Array).Elem", Method, 5, ""},
  6076  		{"(*Array).Len", Method, 5, ""},
  6077  		{"(*Array).String", Method, 5, ""},
  6078  		{"(*Array).Underlying", Method, 5, ""},
  6079  		{"(*Basic).Info", Method, 5, ""},
  6080  		{"(*Basic).Kind", Method, 5, ""},
  6081  		{"(*Basic).Name", Method, 5, ""},
  6082  		{"(*Basic).String", Method, 5, ""},
  6083  		{"(*Basic).Underlying", Method, 5, ""},
  6084  		{"(*Builtin).Exported", Method, 5, ""},
  6085  		{"(*Builtin).Id", Method, 5, ""},
  6086  		{"(*Builtin).Name", Method, 5, ""},
  6087  		{"(*Builtin).Parent", Method, 5, ""},
  6088  		{"(*Builtin).Pkg", Method, 5, ""},
  6089  		{"(*Builtin).Pos", Method, 5, ""},
  6090  		{"(*Builtin).String", Method, 5, ""},
  6091  		{"(*Builtin).Type", Method, 5, ""},
  6092  		{"(*Chan).Dir", Method, 5, ""},
  6093  		{"(*Chan).Elem", Method, 5, ""},
  6094  		{"(*Chan).String", Method, 5, ""},
  6095  		{"(*Chan).Underlying", Method, 5, ""},
  6096  		{"(*Checker).Files", Method, 5, ""},
  6097  		{"(*Config).Check", Method, 5, ""},
  6098  		{"(*Const).Exported", Method, 5, ""},
  6099  		{"(*Const).Id", Method, 5, ""},
  6100  		{"(*Const).Name", Method, 5, ""},
  6101  		{"(*Const).Parent", Method, 5, ""},
  6102  		{"(*Const).Pkg", Method, 5, ""},
  6103  		{"(*Const).Pos", Method, 5, ""},
  6104  		{"(*Const).String", Method, 5, ""},
  6105  		{"(*Const).Type", Method, 5, ""},
  6106  		{"(*Const).Val", Method, 5, ""},
  6107  		{"(*Func).Exported", Method, 5, ""},
  6108  		{"(*Func).FullName", Method, 5, ""},
  6109  		{"(*Func).Id", Method, 5, ""},
  6110  		{"(*Func).Name", Method, 5, ""},
  6111  		{"(*Func).Origin", Method, 19, ""},
  6112  		{"(*Func).Parent", Method, 5, ""},
  6113  		{"(*Func).Pkg", Method, 5, ""},
  6114  		{"(*Func).Pos", Method, 5, ""},
  6115  		{"(*Func).Scope", Method, 5, ""},
  6116  		{"(*Func).Signature", Method, 23, ""},
  6117  		{"(*Func).String", Method, 5, ""},
  6118  		{"(*Func).Type", Method, 5, ""},
  6119  		{"(*Info).ObjectOf", Method, 5, ""},
  6120  		{"(*Info).PkgNameOf", Method, 22, ""},
  6121  		{"(*Info).TypeOf", Method, 5, ""},
  6122  		{"(*Initializer).String", Method, 5, ""},
  6123  		{"(*Interface).Complete", Method, 5, ""},
  6124  		{"(*Interface).Embedded", Method, 5, ""},
  6125  		{"(*Interface).EmbeddedType", Method, 11, ""},
  6126  		{"(*Interface).EmbeddedTypes", Method, 24, ""},
  6127  		{"(*Interface).Empty", Method, 5, ""},
  6128  		{"(*Interface).ExplicitMethod", Method, 5, ""},
  6129  		{"(*Interface).ExplicitMethods", Method, 24, ""},
  6130  		{"(*Interface).IsComparable", Method, 18, ""},
  6131  		{"(*Interface).IsImplicit", Method, 18, ""},
  6132  		{"(*Interface).IsMethodSet", Method, 18, ""},
  6133  		{"(*Interface).MarkImplicit", Method, 18, ""},
  6134  		{"(*Interface).Method", Method, 5, ""},
  6135  		{"(*Interface).Methods", Method, 24, ""},
  6136  		{"(*Interface).NumEmbeddeds", Method, 5, ""},
  6137  		{"(*Interface).NumExplicitMethods", Method, 5, ""},
  6138  		{"(*Interface).NumMethods", Method, 5, ""},
  6139  		{"(*Interface).String", Method, 5, ""},
  6140  		{"(*Interface).Underlying", Method, 5, ""},
  6141  		{"(*Label).Exported", Method, 5, ""},
  6142  		{"(*Label).Id", Method, 5, ""},
  6143  		{"(*Label).Name", Method, 5, ""},
  6144  		{"(*Label).Parent", Method, 5, ""},
  6145  		{"(*Label).Pkg", Method, 5, ""},
  6146  		{"(*Label).Pos", Method, 5, ""},
  6147  		{"(*Label).String", Method, 5, ""},
  6148  		{"(*Label).Type", Method, 5, ""},
  6149  		{"(*Map).Elem", Method, 5, ""},
  6150  		{"(*Map).Key", Method, 5, ""},
  6151  		{"(*Map).String", Method, 5, ""},
  6152  		{"(*Map).Underlying", Method, 5, ""},
  6153  		{"(*MethodSet).At", Method, 5, ""},
  6154  		{"(*MethodSet).Len", Method, 5, ""},
  6155  		{"(*MethodSet).Lookup", Method, 5, ""},
  6156  		{"(*MethodSet).Methods", Method, 24, ""},
  6157  		{"(*MethodSet).String", Method, 5, ""},
  6158  		{"(*Named).AddMethod", Method, 5, ""},
  6159  		{"(*Named).Method", Method, 5, ""},
  6160  		{"(*Named).Methods", Method, 24, ""},
  6161  		{"(*Named).NumMethods", Method, 5, ""},
  6162  		{"(*Named).Obj", Method, 5, ""},
  6163  		{"(*Named).Origin", Method, 18, ""},
  6164  		{"(*Named).SetTypeParams", Method, 18, ""},
  6165  		{"(*Named).SetUnderlying", Method, 5, ""},
  6166  		{"(*Named).String", Method, 5, ""},
  6167  		{"(*Named).TypeArgs", Method, 18, ""},
  6168  		{"(*Named).TypeParams", Method, 18, ""},
  6169  		{"(*Named).Underlying", Method, 5, ""},
  6170  		{"(*Nil).Exported", Method, 5, ""},
  6171  		{"(*Nil).Id", Method, 5, ""},
  6172  		{"(*Nil).Name", Method, 5, ""},
  6173  		{"(*Nil).Parent", Method, 5, ""},
  6174  		{"(*Nil).Pkg", Method, 5, ""},
  6175  		{"(*Nil).Pos", Method, 5, ""},
  6176  		{"(*Nil).String", Method, 5, ""},
  6177  		{"(*Nil).Type", Method, 5, ""},
  6178  		{"(*Package).Complete", Method, 5, ""},
  6179  		{"(*Package).GoVersion", Method, 21, ""},
  6180  		{"(*Package).Imports", Method, 5, ""},
  6181  		{"(*Package).MarkComplete", Method, 5, ""},
  6182  		{"(*Package).Name", Method, 5, ""},
  6183  		{"(*Package).Path", Method, 5, ""},
  6184  		{"(*Package).Scope", Method, 5, ""},
  6185  		{"(*Package).SetImports", Method, 5, ""},
  6186  		{"(*Package).SetName", Method, 6, ""},
  6187  		{"(*Package).String", Method, 5, ""},
  6188  		{"(*PkgName).Exported", Method, 5, ""},
  6189  		{"(*PkgName).Id", Method, 5, ""},
  6190  		{"(*PkgName).Imported", Method, 5, ""},
  6191  		{"(*PkgName).Name", Method, 5, ""},
  6192  		{"(*PkgName).Parent", Method, 5, ""},
  6193  		{"(*PkgName).Pkg", Method, 5, ""},
  6194  		{"(*PkgName).Pos", Method, 5, ""},
  6195  		{"(*PkgName).String", Method, 5, ""},
  6196  		{"(*PkgName).Type", Method, 5, ""},
  6197  		{"(*Pointer).Elem", Method, 5, ""},
  6198  		{"(*Pointer).String", Method, 5, ""},
  6199  		{"(*Pointer).Underlying", Method, 5, ""},
  6200  		{"(*Scope).Child", Method, 5, ""},
  6201  		{"(*Scope).Children", Method, 24, ""},
  6202  		{"(*Scope).Contains", Method, 5, ""},
  6203  		{"(*Scope).End", Method, 5, ""},
  6204  		{"(*Scope).Innermost", Method, 5, ""},
  6205  		{"(*Scope).Insert", Method, 5, ""},
  6206  		{"(*Scope).Len", Method, 5, ""},
  6207  		{"(*Scope).Lookup", Method, 5, ""},
  6208  		{"(*Scope).LookupParent", Method, 5, ""},
  6209  		{"(*Scope).Names", Method, 5, ""},
  6210  		{"(*Scope).NumChildren", Method, 5, ""},
  6211  		{"(*Scope).Parent", Method, 5, ""},
  6212  		{"(*Scope).Pos", Method, 5, ""},
  6213  		{"(*Scope).String", Method, 5, ""},
  6214  		{"(*Scope).WriteTo", Method, 5, ""},
  6215  		{"(*Selection).Index", Method, 5, ""},
  6216  		{"(*Selection).Indirect", Method, 5, ""},
  6217  		{"(*Selection).Kind", Method, 5, ""},
  6218  		{"(*Selection).Obj", Method, 5, ""},
  6219  		{"(*Selection).Recv", Method, 5, ""},
  6220  		{"(*Selection).String", Method, 5, ""},
  6221  		{"(*Selection).Type", Method, 5, ""},
  6222  		{"(*Signature).Params", Method, 5, ""},
  6223  		{"(*Signature).Recv", Method, 5, ""},
  6224  		{"(*Signature).RecvTypeParams", Method, 18, ""},
  6225  		{"(*Signature).Results", Method, 5, ""},
  6226  		{"(*Signature).String", Method, 5, ""},
  6227  		{"(*Signature).TypeParams", Method, 18, ""},
  6228  		{"(*Signature).Underlying", Method, 5, ""},
  6229  		{"(*Signature).Variadic", Method, 5, ""},
  6230  		{"(*Slice).Elem", Method, 5, ""},
  6231  		{"(*Slice).String", Method, 5, ""},
  6232  		{"(*Slice).Underlying", Method, 5, ""},
  6233  		{"(*StdSizes).Alignof", Method, 5, ""},
  6234  		{"(*StdSizes).Offsetsof", Method, 5, ""},
  6235  		{"(*StdSizes).Sizeof", Method, 5, ""},
  6236  		{"(*Struct).Field", Method, 5, ""},
  6237  		{"(*Struct).Fields", Method, 24, ""},
  6238  		{"(*Struct).NumFields", Method, 5, ""},
  6239  		{"(*Struct).String", Method, 5, ""},
  6240  		{"(*Struct).Tag", Method, 5, ""},
  6241  		{"(*Struct).Underlying", Method, 5, ""},
  6242  		{"(*Term).String", Method, 18, ""},
  6243  		{"(*Term).Tilde", Method, 18, ""},
  6244  		{"(*Term).Type", Method, 18, ""},
  6245  		{"(*Tuple).At", Method, 5, ""},
  6246  		{"(*Tuple).Len", Method, 5, ""},
  6247  		{"(*Tuple).String", Method, 5, ""},
  6248  		{"(*Tuple).Underlying", Method, 5, ""},
  6249  		{"(*Tuple).Variables", Method, 24, ""},
  6250  		{"(*TypeList).At", Method, 18, ""},
  6251  		{"(*TypeList).Len", Method, 18, ""},
  6252  		{"(*TypeList).Types", Method, 24, ""},
  6253  		{"(*TypeName).Exported", Method, 5, ""},
  6254  		{"(*TypeName).Id", Method, 5, ""},
  6255  		{"(*TypeName).IsAlias", Method, 9, ""},
  6256  		{"(*TypeName).Name", Method, 5, ""},
  6257  		{"(*TypeName).Parent", Method, 5, ""},
  6258  		{"(*TypeName).Pkg", Method, 5, ""},
  6259  		{"(*TypeName).Pos", Method, 5, ""},
  6260  		{"(*TypeName).String", Method, 5, ""},
  6261  		{"(*TypeName).Type", Method, 5, ""},
  6262  		{"(*TypeParam).Constraint", Method, 18, ""},
  6263  		{"(*TypeParam).Index", Method, 18, ""},
  6264  		{"(*TypeParam).Obj", Method, 18, ""},
  6265  		{"(*TypeParam).SetConstraint", Method, 18, ""},
  6266  		{"(*TypeParam).String", Method, 18, ""},
  6267  		{"(*TypeParam).Underlying", Method, 18, ""},
  6268  		{"(*TypeParamList).At", Method, 18, ""},
  6269  		{"(*TypeParamList).Len", Method, 18, ""},
  6270  		{"(*TypeParamList).TypeParams", Method, 24, ""},
  6271  		{"(*Union).Len", Method, 18, ""},
  6272  		{"(*Union).String", Method, 18, ""},
  6273  		{"(*Union).Term", Method, 18, ""},
  6274  		{"(*Union).Terms", Method, 24, ""},
  6275  		{"(*Union).Underlying", Method, 18, ""},
  6276  		{"(*Var).Anonymous", Method, 5, ""},
  6277  		{"(*Var).Embedded", Method, 11, ""},
  6278  		{"(*Var).Exported", Method, 5, ""},
  6279  		{"(*Var).Id", Method, 5, ""},
  6280  		{"(*Var).IsField", Method, 5, ""},
  6281  		{"(*Var).Kind", Method, 25, ""},
  6282  		{"(*Var).Name", Method, 5, ""},
  6283  		{"(*Var).Origin", Method, 19, ""},
  6284  		{"(*Var).Parent", Method, 5, ""},
  6285  		{"(*Var).Pkg", Method, 5, ""},
  6286  		{"(*Var).Pos", Method, 5, ""},
  6287  		{"(*Var).SetKind", Method, 25, ""},
  6288  		{"(*Var).String", Method, 5, ""},
  6289  		{"(*Var).Type", Method, 5, ""},
  6290  		{"(Checker).ObjectOf", Method, 5, ""},
  6291  		{"(Checker).PkgNameOf", Method, 22, ""},
  6292  		{"(Checker).TypeOf", Method, 5, ""},
  6293  		{"(Error).Error", Method, 5, ""},
  6294  		{"(TypeAndValue).Addressable", Method, 5, ""},
  6295  		{"(TypeAndValue).Assignable", Method, 5, ""},
  6296  		{"(TypeAndValue).HasOk", Method, 5, ""},
  6297  		{"(TypeAndValue).IsBuiltin", Method, 5, ""},
  6298  		{"(TypeAndValue).IsNil", Method, 5, ""},
  6299  		{"(TypeAndValue).IsType", Method, 5, ""},
  6300  		{"(TypeAndValue).IsValue", Method, 5, ""},
  6301  		{"(TypeAndValue).IsVoid", Method, 5, ""},
  6302  		{"(VarKind).String", Method, 25, ""},
  6303  		{"Alias", Type, 22, ""},
  6304  		{"ArgumentError", Type, 18, ""},
  6305  		{"ArgumentError.Err", Field, 18, ""},
  6306  		{"ArgumentError.Index", Field, 18, ""},
  6307  		{"Array", Type, 5, ""},
  6308  		{"AssertableTo", Func, 5, "func(V *Interface, T Type) bool"},
  6309  		{"AssignableTo", Func, 5, "func(V Type, T Type) bool"},
  6310  		{"Basic", Type, 5, ""},
  6311  		{"BasicInfo", Type, 5, ""},
  6312  		{"BasicKind", Type, 5, ""},
  6313  		{"Bool", Const, 5, ""},
  6314  		{"Builtin", Type, 5, ""},
  6315  		{"Byte", Const, 5, ""},
  6316  		{"Chan", Type, 5, ""},
  6317  		{"ChanDir", Type, 5, ""},
  6318  		{"CheckExpr", Func, 13, "func(fset *token.FileSet, pkg *Package, pos token.Pos, expr ast.Expr, info *Info) (err error)"},
  6319  		{"Checker", Type, 5, ""},
  6320  		{"Checker.Info", Field, 5, ""},
  6321  		{"Comparable", Func, 5, "func(T Type) bool"},
  6322  		{"Complex128", Const, 5, ""},
  6323  		{"Complex64", Const, 5, ""},
  6324  		{"Config", Type, 5, ""},
  6325  		{"Config.Context", Field, 18, ""},
  6326  		{"Config.DisableUnusedImportCheck", Field, 5, ""},
  6327  		{"Config.Error", Field, 5, ""},
  6328  		{"Config.FakeImportC", Field, 5, ""},
  6329  		{"Config.GoVersion", Field, 18, ""},
  6330  		{"Config.IgnoreFuncBodies", Field, 5, ""},
  6331  		{"Config.Importer", Field, 5, ""},
  6332  		{"Config.Sizes", Field, 5, ""},
  6333  		{"Const", Type, 5, ""},
  6334  		{"Context", Type, 18, ""},
  6335  		{"ConvertibleTo", Func, 5, "func(V Type, T Type) bool"},
  6336  		{"DefPredeclaredTestFuncs", Func, 5, "func()"},
  6337  		{"Default", Func, 8, "func(t Type) Type"},
  6338  		{"Error", Type, 5, ""},
  6339  		{"Error.Fset", Field, 5, ""},
  6340  		{"Error.Msg", Field, 5, ""},
  6341  		{"Error.Pos", Field, 5, ""},
  6342  		{"Error.Soft", Field, 5, ""},
  6343  		{"Eval", Func, 5, "func(fset *token.FileSet, pkg *Package, pos token.Pos, expr string) (_ TypeAndValue, err error)"},
  6344  		{"ExprString", Func, 5, "func(x ast.Expr) string"},
  6345  		{"FieldVal", Const, 5, ""},
  6346  		{"FieldVar", Const, 25, ""},
  6347  		{"Float32", Const, 5, ""},
  6348  		{"Float64", Const, 5, ""},
  6349  		{"Func", Type, 5, ""},
  6350  		{"Id", Func, 5, "func(pkg *Package, name string) string"},
  6351  		{"Identical", Func, 5, "func(x Type, y Type) bool"},
  6352  		{"IdenticalIgnoreTags", Func, 8, "func(x Type, y Type) bool"},
  6353  		{"Implements", Func, 5, "func(V Type, T *Interface) bool"},
  6354  		{"ImportMode", Type, 6, ""},
  6355  		{"Importer", Type, 5, ""},
  6356  		{"ImporterFrom", Type, 6, ""},
  6357  		{"Info", Type, 5, ""},
  6358  		{"Info.Defs", Field, 5, ""},
  6359  		{"Info.FileVersions", Field, 22, ""},
  6360  		{"Info.Implicits", Field, 5, ""},
  6361  		{"Info.InitOrder", Field, 5, ""},
  6362  		{"Info.Instances", Field, 18, ""},
  6363  		{"Info.Scopes", Field, 5, ""},
  6364  		{"Info.Selections", Field, 5, ""},
  6365  		{"Info.Types", Field, 5, ""},
  6366  		{"Info.Uses", Field, 5, ""},
  6367  		{"Initializer", Type, 5, ""},
  6368  		{"Initializer.Lhs", Field, 5, ""},
  6369  		{"Initializer.Rhs", Field, 5, ""},
  6370  		{"Instance", Type, 18, ""},
  6371  		{"Instance.Type", Field, 18, ""},
  6372  		{"Instance.TypeArgs", Field, 18, ""},
  6373  		{"Instantiate", Func, 18, "func(ctxt *Context, orig Type, targs []Type, validate bool) (Type, error)"},
  6374  		{"Int", Const, 5, ""},
  6375  		{"Int16", Const, 5, ""},
  6376  		{"Int32", Const, 5, ""},
  6377  		{"Int64", Const, 5, ""},
  6378  		{"Int8", Const, 5, ""},
  6379  		{"Interface", Type, 5, ""},
  6380  		{"Invalid", Const, 5, ""},
  6381  		{"IsBoolean", Const, 5, ""},
  6382  		{"IsComplex", Const, 5, ""},
  6383  		{"IsConstType", Const, 5, ""},
  6384  		{"IsFloat", Const, 5, ""},
  6385  		{"IsInteger", Const, 5, ""},
  6386  		{"IsInterface", Func, 5, "func(t Type) bool"},
  6387  		{"IsNumeric", Const, 5, ""},
  6388  		{"IsOrdered", Const, 5, ""},
  6389  		{"IsString", Const, 5, ""},
  6390  		{"IsUnsigned", Const, 5, ""},
  6391  		{"IsUntyped", Const, 5, ""},
  6392  		{"Label", Type, 5, ""},
  6393  		{"LocalVar", Const, 25, ""},
  6394  		{"LookupFieldOrMethod", Func, 5, "func(T Type, addressable bool, pkg *Package, name string) (obj Object, index []int, indirect bool)"},
  6395  		{"LookupSelection", Func, 25, "func(T Type, addressable bool, pkg *Package, name string) (Selection, bool)"},
  6396  		{"Map", Type, 5, ""},
  6397  		{"MethodExpr", Const, 5, ""},
  6398  		{"MethodSet", Type, 5, ""},
  6399  		{"MethodVal", Const, 5, ""},
  6400  		{"MissingMethod", Func, 5, "func(V Type, T *Interface, static bool) (method *Func, wrongType bool)"},
  6401  		{"Named", Type, 5, ""},
  6402  		{"NewAlias", Func, 22, "func(obj *TypeName, rhs Type) *Alias"},
  6403  		{"NewArray", Func, 5, "func(elem Type, len int64) *Array"},
  6404  		{"NewChan", Func, 5, "func(dir ChanDir, elem Type) *Chan"},
  6405  		{"NewChecker", Func, 5, "func(conf *Config, fset *token.FileSet, pkg *Package, info *Info) *Checker"},
  6406  		{"NewConst", Func, 5, "func(pos token.Pos, pkg *Package, name string, typ Type, val constant.Value) *Const"},
  6407  		{"NewContext", Func, 18, "func() *Context"},
  6408  		{"NewField", Func, 5, "func(pos token.Pos, pkg *Package, name string, typ Type, embedded bool) *Var"},
  6409  		{"NewFunc", Func, 5, "func(pos token.Pos, pkg *Package, name string, sig *Signature) *Func"},
  6410  		{"NewInterface", Func, 5, "func(methods []*Func, embeddeds []*Named) *Interface"},
  6411  		{"NewInterfaceType", Func, 11, "func(methods []*Func, embeddeds []Type) *Interface"},
  6412  		{"NewLabel", Func, 5, "func(pos token.Pos, pkg *Package, name string) *Label"},
  6413  		{"NewMap", Func, 5, "func(key Type, elem Type) *Map"},
  6414  		{"NewMethodSet", Func, 5, "func(T Type) *MethodSet"},
  6415  		{"NewNamed", Func, 5, "func(obj *TypeName, underlying Type, methods []*Func) *Named"},
  6416  		{"NewPackage", Func, 5, "func(path string, name string) *Package"},
  6417  		{"NewParam", Func, 5, "func(pos token.Pos, pkg *Package, name string, typ Type) *Var"},
  6418  		{"NewPkgName", Func, 5, "func(pos token.Pos, pkg *Package, name string, imported *Package) *PkgName"},
  6419  		{"NewPointer", Func, 5, "func(elem Type) *Pointer"},
  6420  		{"NewScope", Func, 5, "func(parent *Scope, pos token.Pos, end token.Pos, comment string) *Scope"},
  6421  		{"NewSignature", Func, 5, "func(recv *Var, params *Tuple, results *Tuple, variadic bool) *Signature"},
  6422  		{"NewSignatureType", Func, 18, "func(recv *Var, recvTypeParams []*TypeParam, typeParams []*TypeParam, params *Tuple, results *Tuple, variadic bool) *Signature"},
  6423  		{"NewSlice", Func, 5, "func(elem Type) *Slice"},
  6424  		{"NewStruct", Func, 5, "func(fields []*Var, tags []string) *Struct"},
  6425  		{"NewTerm", Func, 18, "func(tilde bool, typ Type) *Term"},
  6426  		{"NewTuple", Func, 5, "func(x ...*Var) *Tuple"},
  6427  		{"NewTypeName", Func, 5, "func(pos token.Pos, pkg *Package, name string, typ Type) *TypeName"},
  6428  		{"NewTypeParam", Func, 18, "func(obj *TypeName, constraint Type) *TypeParam"},
  6429  		{"NewUnion", Func, 18, "func(terms []*Term) *Union"},
  6430  		{"NewVar", Func, 5, "func(pos token.Pos, pkg *Package, name string, typ Type) *Var"},
  6431  		{"Nil", Type, 5, ""},
  6432  		{"Object", Type, 5, ""},
  6433  		{"ObjectString", Func, 5, "func(obj Object, qf Qualifier) string"},
  6434  		{"Package", Type, 5, ""},
  6435  		{"PackageVar", Const, 25, ""},
  6436  		{"ParamVar", Const, 25, ""},
  6437  		{"PkgName", Type, 5, ""},
  6438  		{"Pointer", Type, 5, ""},
  6439  		{"Qualifier", Type, 5, ""},
  6440  		{"RecvOnly", Const, 5, ""},
  6441  		{"RecvVar", Const, 25, ""},
  6442  		{"RelativeTo", Func, 5, "func(pkg *Package) Qualifier"},
  6443  		{"ResultVar", Const, 25, ""},
  6444  		{"Rune", Const, 5, ""},
  6445  		{"Satisfies", Func, 20, "func(V Type, T *Interface) bool"},
  6446  		{"Scope", Type, 5, ""},
  6447  		{"Selection", Type, 5, ""},
  6448  		{"SelectionKind", Type, 5, ""},
  6449  		{"SelectionString", Func, 5, "func(s *Selection, qf Qualifier) string"},
  6450  		{"SendOnly", Const, 5, ""},
  6451  		{"SendRecv", Const, 5, ""},
  6452  		{"Signature", Type, 5, ""},
  6453  		{"Sizes", Type, 5, ""},
  6454  		{"SizesFor", Func, 9, "func(compiler string, arch string) Sizes"},
  6455  		{"Slice", Type, 5, ""},
  6456  		{"StdSizes", Type, 5, ""},
  6457  		{"StdSizes.MaxAlign", Field, 5, ""},
  6458  		{"StdSizes.WordSize", Field, 5, ""},
  6459  		{"String", Const, 5, ""},
  6460  		{"Struct", Type, 5, ""},
  6461  		{"Term", Type, 18, ""},
  6462  		{"Tuple", Type, 5, ""},
  6463  		{"Typ", Var, 5, ""},
  6464  		{"Type", Type, 5, ""},
  6465  		{"TypeAndValue", Type, 5, ""},
  6466  		{"TypeAndValue.Type", Field, 5, ""},
  6467  		{"TypeAndValue.Value", Field, 5, ""},
  6468  		{"TypeList", Type, 18, ""},
  6469  		{"TypeName", Type, 5, ""},
  6470  		{"TypeParam", Type, 18, ""},
  6471  		{"TypeParamList", Type, 18, ""},
  6472  		{"TypeString", Func, 5, "func(typ Type, qf Qualifier) string"},
  6473  		{"Uint", Const, 5, ""},
  6474  		{"Uint16", Const, 5, ""},
  6475  		{"Uint32", Const, 5, ""},
  6476  		{"Uint64", Const, 5, ""},
  6477  		{"Uint8", Const, 5, ""},
  6478  		{"Uintptr", Const, 5, ""},
  6479  		{"Unalias", Func, 22, "func(t Type) Type"},
  6480  		{"Union", Type, 18, ""},
  6481  		{"Universe", Var, 5, ""},
  6482  		{"Unsafe", Var, 5, ""},
  6483  		{"UnsafePointer", Const, 5, ""},
  6484  		{"UntypedBool", Const, 5, ""},
  6485  		{"UntypedComplex", Const, 5, ""},
  6486  		{"UntypedFloat", Const, 5, ""},
  6487  		{"UntypedInt", Const, 5, ""},
  6488  		{"UntypedNil", Const, 5, ""},
  6489  		{"UntypedRune", Const, 5, ""},
  6490  		{"UntypedString", Const, 5, ""},
  6491  		{"Var", Type, 5, ""},
  6492  		{"VarKind", Type, 25, ""},
  6493  		{"WriteExpr", Func, 5, "func(buf *bytes.Buffer, x ast.Expr)"},
  6494  		{"WriteSignature", Func, 5, "func(buf *bytes.Buffer, sig *Signature, qf Qualifier)"},
  6495  		{"WriteType", Func, 5, "func(buf *bytes.Buffer, typ Type, qf Qualifier)"},
  6496  	},
  6497  	"go/version": {
  6498  		{"Compare", Func, 22, "func(x string, y string) int"},
  6499  		{"IsValid", Func, 22, "func(x string) bool"},
  6500  		{"Lang", Func, 22, "func(x string) string"},
  6501  	},
  6502  	"hash": {
  6503  		{"Cloner", Type, 25, ""},
  6504  		{"Hash", Type, 0, ""},
  6505  		{"Hash32", Type, 0, ""},
  6506  		{"Hash64", Type, 0, ""},
  6507  		{"XOF", Type, 25, ""},
  6508  	},
  6509  	"hash/adler32": {
  6510  		{"Checksum", Func, 0, "func(data []byte) uint32"},
  6511  		{"New", Func, 0, "func() hash.Hash32"},
  6512  		{"Size", Const, 0, ""},
  6513  	},
  6514  	"hash/crc32": {
  6515  		{"Castagnoli", Const, 0, ""},
  6516  		{"Checksum", Func, 0, "func(data []byte, tab *Table) uint32"},
  6517  		{"ChecksumIEEE", Func, 0, "func(data []byte) uint32"},
  6518  		{"IEEE", Const, 0, ""},
  6519  		{"IEEETable", Var, 0, ""},
  6520  		{"Koopman", Const, 0, ""},
  6521  		{"MakeTable", Func, 0, "func(poly uint32) *Table"},
  6522  		{"New", Func, 0, "func(tab *Table) hash.Hash32"},
  6523  		{"NewIEEE", Func, 0, "func() hash.Hash32"},
  6524  		{"Size", Const, 0, ""},
  6525  		{"Table", Type, 0, ""},
  6526  		{"Update", Func, 0, "func(crc uint32, tab *Table, p []byte) uint32"},
  6527  	},
  6528  	"hash/crc64": {
  6529  		{"Checksum", Func, 0, "func(data []byte, tab *Table) uint64"},
  6530  		{"ECMA", Const, 0, ""},
  6531  		{"ISO", Const, 0, ""},
  6532  		{"MakeTable", Func, 0, "func(poly uint64) *Table"},
  6533  		{"New", Func, 0, "func(tab *Table) hash.Hash64"},
  6534  		{"Size", Const, 0, ""},
  6535  		{"Table", Type, 0, ""},
  6536  		{"Update", Func, 0, "func(crc uint64, tab *Table, p []byte) uint64"},
  6537  	},
  6538  	"hash/fnv": {
  6539  		{"New128", Func, 9, "func() hash.Hash"},
  6540  		{"New128a", Func, 9, "func() hash.Hash"},
  6541  		{"New32", Func, 0, "func() hash.Hash32"},
  6542  		{"New32a", Func, 0, "func() hash.Hash32"},
  6543  		{"New64", Func, 0, "func() hash.Hash64"},
  6544  		{"New64a", Func, 0, "func() hash.Hash64"},
  6545  	},
  6546  	"hash/maphash": {
  6547  		{"(*Hash).BlockSize", Method, 14, ""},
  6548  		{"(*Hash).Clone", Method, 25, ""},
  6549  		{"(*Hash).Reset", Method, 14, ""},
  6550  		{"(*Hash).Seed", Method, 14, ""},
  6551  		{"(*Hash).SetSeed", Method, 14, ""},
  6552  		{"(*Hash).Size", Method, 14, ""},
  6553  		{"(*Hash).Sum", Method, 14, ""},
  6554  		{"(*Hash).Sum64", Method, 14, ""},
  6555  		{"(*Hash).Write", Method, 14, ""},
  6556  		{"(*Hash).WriteByte", Method, 14, ""},
  6557  		{"(*Hash).WriteString", Method, 14, ""},
  6558  		{"Bytes", Func, 19, "func(seed Seed, b []byte) uint64"},
  6559  		{"Comparable", Func, 24, "func[T comparable](seed Seed, v T) uint64"},
  6560  		{"Hash", Type, 14, ""},
  6561  		{"MakeSeed", Func, 14, "func() Seed"},
  6562  		{"Seed", Type, 14, ""},
  6563  		{"String", Func, 19, "func(seed Seed, s string) uint64"},
  6564  		{"WriteComparable", Func, 24, "func[T comparable](h *Hash, x T)"},
  6565  	},
  6566  	"html": {
  6567  		{"EscapeString", Func, 0, "func(s string) string"},
  6568  		{"UnescapeString", Func, 0, "func(s string) string"},
  6569  	},
  6570  	"html/template": {
  6571  		{"(*Error).Error", Method, 0, ""},
  6572  		{"(*Template).AddParseTree", Method, 0, ""},
  6573  		{"(*Template).Clone", Method, 0, ""},
  6574  		{"(*Template).DefinedTemplates", Method, 6, ""},
  6575  		{"(*Template).Delims", Method, 0, ""},
  6576  		{"(*Template).Execute", Method, 0, ""},
  6577  		{"(*Template).ExecuteTemplate", Method, 0, ""},
  6578  		{"(*Template).Funcs", Method, 0, ""},
  6579  		{"(*Template).Lookup", Method, 0, ""},
  6580  		{"(*Template).Name", Method, 0, ""},
  6581  		{"(*Template).New", Method, 0, ""},
  6582  		{"(*Template).Option", Method, 5, ""},
  6583  		{"(*Template).Parse", Method, 0, ""},
  6584  		{"(*Template).ParseFS", Method, 16, ""},
  6585  		{"(*Template).ParseFiles", Method, 0, ""},
  6586  		{"(*Template).ParseGlob", Method, 0, ""},
  6587  		{"(*Template).Templates", Method, 0, ""},
  6588  		{"CSS", Type, 0, ""},
  6589  		{"ErrAmbigContext", Const, 0, ""},
  6590  		{"ErrBadHTML", Const, 0, ""},
  6591  		{"ErrBranchEnd", Const, 0, ""},
  6592  		{"ErrEndContext", Const, 0, ""},
  6593  		{"ErrJSTemplate", Const, 21, ""},
  6594  		{"ErrNoSuchTemplate", Const, 0, ""},
  6595  		{"ErrOutputContext", Const, 0, ""},
  6596  		{"ErrPartialCharset", Const, 0, ""},
  6597  		{"ErrPartialEscape", Const, 0, ""},
  6598  		{"ErrPredefinedEscaper", Const, 9, ""},
  6599  		{"ErrRangeLoopReentry", Const, 0, ""},
  6600  		{"ErrSlashAmbig", Const, 0, ""},
  6601  		{"Error", Type, 0, ""},
  6602  		{"Error.Description", Field, 0, ""},
  6603  		{"Error.ErrorCode", Field, 0, ""},
  6604  		{"Error.Line", Field, 0, ""},
  6605  		{"Error.Name", Field, 0, ""},
  6606  		{"Error.Node", Field, 4, ""},
  6607  		{"ErrorCode", Type, 0, ""},
  6608  		{"FuncMap", Type, 0, ""},
  6609  		{"HTML", Type, 0, ""},
  6610  		{"HTMLAttr", Type, 0, ""},
  6611  		{"HTMLEscape", Func, 0, "func(w io.Writer, b []byte)"},
  6612  		{"HTMLEscapeString", Func, 0, "func(s string) string"},
  6613  		{"HTMLEscaper", Func, 0, "func(args ...any) string"},
  6614  		{"IsTrue", Func, 6, "func(val any) (truth bool, ok bool)"},
  6615  		{"JS", Type, 0, ""},
  6616  		{"JSEscape", Func, 0, "func(w io.Writer, b []byte)"},
  6617  		{"JSEscapeString", Func, 0, "func(s string) string"},
  6618  		{"JSEscaper", Func, 0, "func(args ...any) string"},
  6619  		{"JSStr", Type, 0, ""},
  6620  		{"Must", Func, 0, "func(t *Template, err error) *Template"},
  6621  		{"New", Func, 0, "func(name string) *Template"},
  6622  		{"OK", Const, 0, ""},
  6623  		{"ParseFS", Func, 16, "func(fs fs.FS, patterns ...string) (*Template, error)"},
  6624  		{"ParseFiles", Func, 0, "func(filenames ...string) (*Template, error)"},
  6625  		{"ParseGlob", Func, 0, "func(pattern string) (*Template, error)"},
  6626  		{"Srcset", Type, 10, ""},
  6627  		{"Template", Type, 0, ""},
  6628  		{"Template.Tree", Field, 2, ""},
  6629  		{"URL", Type, 0, ""},
  6630  		{"URLQueryEscaper", Func, 0, "func(args ...any) string"},
  6631  	},
  6632  	"image": {
  6633  		{"(*Alpha).AlphaAt", Method, 4, ""},
  6634  		{"(*Alpha).At", Method, 0, ""},
  6635  		{"(*Alpha).Bounds", Method, 0, ""},
  6636  		{"(*Alpha).ColorModel", Method, 0, ""},
  6637  		{"(*Alpha).Opaque", Method, 0, ""},
  6638  		{"(*Alpha).PixOffset", Method, 0, ""},
  6639  		{"(*Alpha).RGBA64At", Method, 17, ""},
  6640  		{"(*Alpha).Set", Method, 0, ""},
  6641  		{"(*Alpha).SetAlpha", Method, 0, ""},
  6642  		{"(*Alpha).SetRGBA64", Method, 17, ""},
  6643  		{"(*Alpha).SubImage", Method, 0, ""},
  6644  		{"(*Alpha16).Alpha16At", Method, 4, ""},
  6645  		{"(*Alpha16).At", Method, 0, ""},
  6646  		{"(*Alpha16).Bounds", Method, 0, ""},
  6647  		{"(*Alpha16).ColorModel", Method, 0, ""},
  6648  		{"(*Alpha16).Opaque", Method, 0, ""},
  6649  		{"(*Alpha16).PixOffset", Method, 0, ""},
  6650  		{"(*Alpha16).RGBA64At", Method, 17, ""},
  6651  		{"(*Alpha16).Set", Method, 0, ""},
  6652  		{"(*Alpha16).SetAlpha16", Method, 0, ""},
  6653  		{"(*Alpha16).SetRGBA64", Method, 17, ""},
  6654  		{"(*Alpha16).SubImage", Method, 0, ""},
  6655  		{"(*CMYK).At", Method, 5, ""},
  6656  		{"(*CMYK).Bounds", Method, 5, ""},
  6657  		{"(*CMYK).CMYKAt", Method, 5, ""},
  6658  		{"(*CMYK).ColorModel", Method, 5, ""},
  6659  		{"(*CMYK).Opaque", Method, 5, ""},
  6660  		{"(*CMYK).PixOffset", Method, 5, ""},
  6661  		{"(*CMYK).RGBA64At", Method, 17, ""},
  6662  		{"(*CMYK).Set", Method, 5, ""},
  6663  		{"(*CMYK).SetCMYK", Method, 5, ""},
  6664  		{"(*CMYK).SetRGBA64", Method, 17, ""},
  6665  		{"(*CMYK).SubImage", Method, 5, ""},
  6666  		{"(*Gray).At", Method, 0, ""},
  6667  		{"(*Gray).Bounds", Method, 0, ""},
  6668  		{"(*Gray).ColorModel", Method, 0, ""},
  6669  		{"(*Gray).GrayAt", Method, 4, ""},
  6670  		{"(*Gray).Opaque", Method, 0, ""},
  6671  		{"(*Gray).PixOffset", Method, 0, ""},
  6672  		{"(*Gray).RGBA64At", Method, 17, ""},
  6673  		{"(*Gray).Set", Method, 0, ""},
  6674  		{"(*Gray).SetGray", Method, 0, ""},
  6675  		{"(*Gray).SetRGBA64", Method, 17, ""},
  6676  		{"(*Gray).SubImage", Method, 0, ""},
  6677  		{"(*Gray16).At", Method, 0, ""},
  6678  		{"(*Gray16).Bounds", Method, 0, ""},
  6679  		{"(*Gray16).ColorModel", Method, 0, ""},
  6680  		{"(*Gray16).Gray16At", Method, 4, ""},
  6681  		{"(*Gray16).Opaque", Method, 0, ""},
  6682  		{"(*Gray16).PixOffset", Method, 0, ""},
  6683  		{"(*Gray16).RGBA64At", Method, 17, ""},
  6684  		{"(*Gray16).Set", Method, 0, ""},
  6685  		{"(*Gray16).SetGray16", Method, 0, ""},
  6686  		{"(*Gray16).SetRGBA64", Method, 17, ""},
  6687  		{"(*Gray16).SubImage", Method, 0, ""},
  6688  		{"(*NRGBA).At", Method, 0, ""},
  6689  		{"(*NRGBA).Bounds", Method, 0, ""},
  6690  		{"(*NRGBA).ColorModel", Method, 0, ""},
  6691  		{"(*NRGBA).NRGBAAt", Method, 4, ""},
  6692  		{"(*NRGBA).Opaque", Method, 0, ""},
  6693  		{"(*NRGBA).PixOffset", Method, 0, ""},
  6694  		{"(*NRGBA).RGBA64At", Method, 17, ""},
  6695  		{"(*NRGBA).Set", Method, 0, ""},
  6696  		{"(*NRGBA).SetNRGBA", Method, 0, ""},
  6697  		{"(*NRGBA).SetRGBA64", Method, 17, ""},
  6698  		{"(*NRGBA).SubImage", Method, 0, ""},
  6699  		{"(*NRGBA64).At", Method, 0, ""},
  6700  		{"(*NRGBA64).Bounds", Method, 0, ""},
  6701  		{"(*NRGBA64).ColorModel", Method, 0, ""},
  6702  		{"(*NRGBA64).NRGBA64At", Method, 4, ""},
  6703  		{"(*NRGBA64).Opaque", Method, 0, ""},
  6704  		{"(*NRGBA64).PixOffset", Method, 0, ""},
  6705  		{"(*NRGBA64).RGBA64At", Method, 17, ""},
  6706  		{"(*NRGBA64).Set", Method, 0, ""},
  6707  		{"(*NRGBA64).SetNRGBA64", Method, 0, ""},
  6708  		{"(*NRGBA64).SetRGBA64", Method, 17, ""},
  6709  		{"(*NRGBA64).SubImage", Method, 0, ""},
  6710  		{"(*NYCbCrA).AOffset", Method, 6, ""},
  6711  		{"(*NYCbCrA).At", Method, 6, ""},
  6712  		{"(*NYCbCrA).Bounds", Method, 6, ""},
  6713  		{"(*NYCbCrA).COffset", Method, 6, ""},
  6714  		{"(*NYCbCrA).ColorModel", Method, 6, ""},
  6715  		{"(*NYCbCrA).NYCbCrAAt", Method, 6, ""},
  6716  		{"(*NYCbCrA).Opaque", Method, 6, ""},
  6717  		{"(*NYCbCrA).RGBA64At", Method, 17, ""},
  6718  		{"(*NYCbCrA).SubImage", Method, 6, ""},
  6719  		{"(*NYCbCrA).YCbCrAt", Method, 6, ""},
  6720  		{"(*NYCbCrA).YOffset", Method, 6, ""},
  6721  		{"(*Paletted).At", Method, 0, ""},
  6722  		{"(*Paletted).Bounds", Method, 0, ""},
  6723  		{"(*Paletted).ColorIndexAt", Method, 0, ""},
  6724  		{"(*Paletted).ColorModel", Method, 0, ""},
  6725  		{"(*Paletted).Opaque", Method, 0, ""},
  6726  		{"(*Paletted).PixOffset", Method, 0, ""},
  6727  		{"(*Paletted).RGBA64At", Method, 17, ""},
  6728  		{"(*Paletted).Set", Method, 0, ""},
  6729  		{"(*Paletted).SetColorIndex", Method, 0, ""},
  6730  		{"(*Paletted).SetRGBA64", Method, 17, ""},
  6731  		{"(*Paletted).SubImage", Method, 0, ""},
  6732  		{"(*RGBA).At", Method, 0, ""},
  6733  		{"(*RGBA).Bounds", Method, 0, ""},
  6734  		{"(*RGBA).ColorModel", Method, 0, ""},
  6735  		{"(*RGBA).Opaque", Method, 0, ""},
  6736  		{"(*RGBA).PixOffset", Method, 0, ""},
  6737  		{"(*RGBA).RGBA64At", Method, 17, ""},
  6738  		{"(*RGBA).RGBAAt", Method, 4, ""},
  6739  		{"(*RGBA).Set", Method, 0, ""},
  6740  		{"(*RGBA).SetRGBA", Method, 0, ""},
  6741  		{"(*RGBA).SetRGBA64", Method, 17, ""},
  6742  		{"(*RGBA).SubImage", Method, 0, ""},
  6743  		{"(*RGBA64).At", Method, 0, ""},
  6744  		{"(*RGBA64).Bounds", Method, 0, ""},
  6745  		{"(*RGBA64).ColorModel", Method, 0, ""},
  6746  		{"(*RGBA64).Opaque", Method, 0, ""},
  6747  		{"(*RGBA64).PixOffset", Method, 0, ""},
  6748  		{"(*RGBA64).RGBA64At", Method, 4, ""},
  6749  		{"(*RGBA64).Set", Method, 0, ""},
  6750  		{"(*RGBA64).SetRGBA64", Method, 0, ""},
  6751  		{"(*RGBA64).SubImage", Method, 0, ""},
  6752  		{"(*Uniform).At", Method, 0, ""},
  6753  		{"(*Uniform).Bounds", Method, 0, ""},
  6754  		{"(*Uniform).ColorModel", Method, 0, ""},
  6755  		{"(*Uniform).Convert", Method, 0, ""},
  6756  		{"(*Uniform).Opaque", Method, 0, ""},
  6757  		{"(*Uniform).RGBA", Method, 0, ""},
  6758  		{"(*Uniform).RGBA64At", Method, 17, ""},
  6759  		{"(*YCbCr).At", Method, 0, ""},
  6760  		{"(*YCbCr).Bounds", Method, 0, ""},
  6761  		{"(*YCbCr).COffset", Method, 0, ""},
  6762  		{"(*YCbCr).ColorModel", Method, 0, ""},
  6763  		{"(*YCbCr).Opaque", Method, 0, ""},
  6764  		{"(*YCbCr).RGBA64At", Method, 17, ""},
  6765  		{"(*YCbCr).SubImage", Method, 0, ""},
  6766  		{"(*YCbCr).YCbCrAt", Method, 4, ""},
  6767  		{"(*YCbCr).YOffset", Method, 0, ""},
  6768  		{"(Point).Add", Method, 0, ""},
  6769  		{"(Point).Div", Method, 0, ""},
  6770  		{"(Point).Eq", Method, 0, ""},
  6771  		{"(Point).In", Method, 0, ""},
  6772  		{"(Point).Mod", Method, 0, ""},
  6773  		{"(Point).Mul", Method, 0, ""},
  6774  		{"(Point).String", Method, 0, ""},
  6775  		{"(Point).Sub", Method, 0, ""},
  6776  		{"(Rectangle).Add", Method, 0, ""},
  6777  		{"(Rectangle).At", Method, 5, ""},
  6778  		{"(Rectangle).Bounds", Method, 5, ""},
  6779  		{"(Rectangle).Canon", Method, 0, ""},
  6780  		{"(Rectangle).ColorModel", Method, 5, ""},
  6781  		{"(Rectangle).Dx", Method, 0, ""},
  6782  		{"(Rectangle).Dy", Method, 0, ""},
  6783  		{"(Rectangle).Empty", Method, 0, ""},
  6784  		{"(Rectangle).Eq", Method, 0, ""},
  6785  		{"(Rectangle).In", Method, 0, ""},
  6786  		{"(Rectangle).Inset", Method, 0, ""},
  6787  		{"(Rectangle).Intersect", Method, 0, ""},
  6788  		{"(Rectangle).Overlaps", Method, 0, ""},
  6789  		{"(Rectangle).RGBA64At", Method, 17, ""},
  6790  		{"(Rectangle).Size", Method, 0, ""},
  6791  		{"(Rectangle).String", Method, 0, ""},
  6792  		{"(Rectangle).Sub", Method, 0, ""},
  6793  		{"(Rectangle).Union", Method, 0, ""},
  6794  		{"(YCbCrSubsampleRatio).String", Method, 0, ""},
  6795  		{"Alpha", Type, 0, ""},
  6796  		{"Alpha.Pix", Field, 0, ""},
  6797  		{"Alpha.Rect", Field, 0, ""},
  6798  		{"Alpha.Stride", Field, 0, ""},
  6799  		{"Alpha16", Type, 0, ""},
  6800  		{"Alpha16.Pix", Field, 0, ""},
  6801  		{"Alpha16.Rect", Field, 0, ""},
  6802  		{"Alpha16.Stride", Field, 0, ""},
  6803  		{"Black", Var, 0, ""},
  6804  		{"CMYK", Type, 5, ""},
  6805  		{"CMYK.Pix", Field, 5, ""},
  6806  		{"CMYK.Rect", Field, 5, ""},
  6807  		{"CMYK.Stride", Field, 5, ""},
  6808  		{"Config", Type, 0, ""},
  6809  		{"Config.ColorModel", Field, 0, ""},
  6810  		{"Config.Height", Field, 0, ""},
  6811  		{"Config.Width", Field, 0, ""},
  6812  		{"Decode", Func, 0, "func(r io.Reader) (Image, string, error)"},
  6813  		{"DecodeConfig", Func, 0, "func(r io.Reader) (Config, string, error)"},
  6814  		{"ErrFormat", Var, 0, ""},
  6815  		{"Gray", Type, 0, ""},
  6816  		{"Gray.Pix", Field, 0, ""},
  6817  		{"Gray.Rect", Field, 0, ""},
  6818  		{"Gray.Stride", Field, 0, ""},
  6819  		{"Gray16", Type, 0, ""},
  6820  		{"Gray16.Pix", Field, 0, ""},
  6821  		{"Gray16.Rect", Field, 0, ""},
  6822  		{"Gray16.Stride", Field, 0, ""},
  6823  		{"Image", Type, 0, ""},
  6824  		{"NRGBA", Type, 0, ""},
  6825  		{"NRGBA.Pix", Field, 0, ""},
  6826  		{"NRGBA.Rect", Field, 0, ""},
  6827  		{"NRGBA.Stride", Field, 0, ""},
  6828  		{"NRGBA64", Type, 0, ""},
  6829  		{"NRGBA64.Pix", Field, 0, ""},
  6830  		{"NRGBA64.Rect", Field, 0, ""},
  6831  		{"NRGBA64.Stride", Field, 0, ""},
  6832  		{"NYCbCrA", Type, 6, ""},
  6833  		{"NYCbCrA.A", Field, 6, ""},
  6834  		{"NYCbCrA.AStride", Field, 6, ""},
  6835  		{"NYCbCrA.YCbCr", Field, 6, ""},
  6836  		{"NewAlpha", Func, 0, "func(r Rectangle) *Alpha"},
  6837  		{"NewAlpha16", Func, 0, "func(r Rectangle) *Alpha16"},
  6838  		{"NewCMYK", Func, 5, "func(r Rectangle) *CMYK"},
  6839  		{"NewGray", Func, 0, "func(r Rectangle) *Gray"},
  6840  		{"NewGray16", Func, 0, "func(r Rectangle) *Gray16"},
  6841  		{"NewNRGBA", Func, 0, "func(r Rectangle) *NRGBA"},
  6842  		{"NewNRGBA64", Func, 0, "func(r Rectangle) *NRGBA64"},
  6843  		{"NewNYCbCrA", Func, 6, "func(r Rectangle, subsampleRatio YCbCrSubsampleRatio) *NYCbCrA"},
  6844  		{"NewPaletted", Func, 0, "func(r Rectangle, p color.Palette) *Paletted"},
  6845  		{"NewRGBA", Func, 0, "func(r Rectangle) *RGBA"},
  6846  		{"NewRGBA64", Func, 0, "func(r Rectangle) *RGBA64"},
  6847  		{"NewUniform", Func, 0, "func(c color.Color) *Uniform"},
  6848  		{"NewYCbCr", Func, 0, "func(r Rectangle, subsampleRatio YCbCrSubsampleRatio) *YCbCr"},
  6849  		{"Opaque", Var, 0, ""},
  6850  		{"Paletted", Type, 0, ""},
  6851  		{"Paletted.Palette", Field, 0, ""},
  6852  		{"Paletted.Pix", Field, 0, ""},
  6853  		{"Paletted.Rect", Field, 0, ""},
  6854  		{"Paletted.Stride", Field, 0, ""},
  6855  		{"PalettedImage", Type, 0, ""},
  6856  		{"Point", Type, 0, ""},
  6857  		{"Point.X", Field, 0, ""},
  6858  		{"Point.Y", Field, 0, ""},
  6859  		{"Pt", Func, 0, "func(X int, Y int) Point"},
  6860  		{"RGBA", Type, 0, ""},
  6861  		{"RGBA.Pix", Field, 0, ""},
  6862  		{"RGBA.Rect", Field, 0, ""},
  6863  		{"RGBA.Stride", Field, 0, ""},
  6864  		{"RGBA64", Type, 0, ""},
  6865  		{"RGBA64.Pix", Field, 0, ""},
  6866  		{"RGBA64.Rect", Field, 0, ""},
  6867  		{"RGBA64.Stride", Field, 0, ""},
  6868  		{"RGBA64Image", Type, 17, ""},
  6869  		{"Rect", Func, 0, "func(x0 int, y0 int, x1 int, y1 int) Rectangle"},
  6870  		{"Rectangle", Type, 0, ""},
  6871  		{"Rectangle.Max", Field, 0, ""},
  6872  		{"Rectangle.Min", Field, 0, ""},
  6873  		{"RegisterFormat", Func, 0, "func(name string, magic string, decode func(io.Reader) (Image, error), decodeConfig func(io.Reader) (Config, error))"},
  6874  		{"Transparent", Var, 0, ""},
  6875  		{"Uniform", Type, 0, ""},
  6876  		{"Uniform.C", Field, 0, ""},
  6877  		{"White", Var, 0, ""},
  6878  		{"YCbCr", Type, 0, ""},
  6879  		{"YCbCr.CStride", Field, 0, ""},
  6880  		{"YCbCr.Cb", Field, 0, ""},
  6881  		{"YCbCr.Cr", Field, 0, ""},
  6882  		{"YCbCr.Rect", Field, 0, ""},
  6883  		{"YCbCr.SubsampleRatio", Field, 0, ""},
  6884  		{"YCbCr.Y", Field, 0, ""},
  6885  		{"YCbCr.YStride", Field, 0, ""},
  6886  		{"YCbCrSubsampleRatio", Type, 0, ""},
  6887  		{"YCbCrSubsampleRatio410", Const, 5, ""},
  6888  		{"YCbCrSubsampleRatio411", Const, 5, ""},
  6889  		{"YCbCrSubsampleRatio420", Const, 0, ""},
  6890  		{"YCbCrSubsampleRatio422", Const, 0, ""},
  6891  		{"YCbCrSubsampleRatio440", Const, 1, ""},
  6892  		{"YCbCrSubsampleRatio444", Const, 0, ""},
  6893  		{"ZP", Var, 0, ""},
  6894  		{"ZR", Var, 0, ""},
  6895  	},
  6896  	"image/color": {
  6897  		{"(Alpha).RGBA", Method, 0, ""},
  6898  		{"(Alpha16).RGBA", Method, 0, ""},
  6899  		{"(CMYK).RGBA", Method, 5, ""},
  6900  		{"(Gray).RGBA", Method, 0, ""},
  6901  		{"(Gray16).RGBA", Method, 0, ""},
  6902  		{"(NRGBA).RGBA", Method, 0, ""},
  6903  		{"(NRGBA64).RGBA", Method, 0, ""},
  6904  		{"(NYCbCrA).RGBA", Method, 6, ""},
  6905  		{"(Palette).Convert", Method, 0, ""},
  6906  		{"(Palette).Index", Method, 0, ""},
  6907  		{"(RGBA).RGBA", Method, 0, ""},
  6908  		{"(RGBA64).RGBA", Method, 0, ""},
  6909  		{"(YCbCr).RGBA", Method, 0, ""},
  6910  		{"Alpha", Type, 0, ""},
  6911  		{"Alpha.A", Field, 0, ""},
  6912  		{"Alpha16", Type, 0, ""},
  6913  		{"Alpha16.A", Field, 0, ""},
  6914  		{"Alpha16Model", Var, 0, ""},
  6915  		{"AlphaModel", Var, 0, ""},
  6916  		{"Black", Var, 0, ""},
  6917  		{"CMYK", Type, 5, ""},
  6918  		{"CMYK.C", Field, 5, ""},
  6919  		{"CMYK.K", Field, 5, ""},
  6920  		{"CMYK.M", Field, 5, ""},
  6921  		{"CMYK.Y", Field, 5, ""},
  6922  		{"CMYKModel", Var, 5, ""},
  6923  		{"CMYKToRGB", Func, 5, "func(c uint8, m uint8, y uint8, k uint8) (uint8, uint8, uint8)"},
  6924  		{"Color", Type, 0, ""},
  6925  		{"Gray", Type, 0, ""},
  6926  		{"Gray.Y", Field, 0, ""},
  6927  		{"Gray16", Type, 0, ""},
  6928  		{"Gray16.Y", Field, 0, ""},
  6929  		{"Gray16Model", Var, 0, ""},
  6930  		{"GrayModel", Var, 0, ""},
  6931  		{"Model", Type, 0, ""},
  6932  		{"ModelFunc", Func, 0, "func(f func(Color) Color) Model"},
  6933  		{"NRGBA", Type, 0, ""},
  6934  		{"NRGBA.A", Field, 0, ""},
  6935  		{"NRGBA.B", Field, 0, ""},
  6936  		{"NRGBA.G", Field, 0, ""},
  6937  		{"NRGBA.R", Field, 0, ""},
  6938  		{"NRGBA64", Type, 0, ""},
  6939  		{"NRGBA64.A", Field, 0, ""},
  6940  		{"NRGBA64.B", Field, 0, ""},
  6941  		{"NRGBA64.G", Field, 0, ""},
  6942  		{"NRGBA64.R", Field, 0, ""},
  6943  		{"NRGBA64Model", Var, 0, ""},
  6944  		{"NRGBAModel", Var, 0, ""},
  6945  		{"NYCbCrA", Type, 6, ""},
  6946  		{"NYCbCrA.A", Field, 6, ""},
  6947  		{"NYCbCrA.YCbCr", Field, 6, ""},
  6948  		{"NYCbCrAModel", Var, 6, ""},
  6949  		{"Opaque", Var, 0, ""},
  6950  		{"Palette", Type, 0, ""},
  6951  		{"RGBA", Type, 0, ""},
  6952  		{"RGBA.A", Field, 0, ""},
  6953  		{"RGBA.B", Field, 0, ""},
  6954  		{"RGBA.G", Field, 0, ""},
  6955  		{"RGBA.R", Field, 0, ""},
  6956  		{"RGBA64", Type, 0, ""},
  6957  		{"RGBA64.A", Field, 0, ""},
  6958  		{"RGBA64.B", Field, 0, ""},
  6959  		{"RGBA64.G", Field, 0, ""},
  6960  		{"RGBA64.R", Field, 0, ""},
  6961  		{"RGBA64Model", Var, 0, ""},
  6962  		{"RGBAModel", Var, 0, ""},
  6963  		{"RGBToCMYK", Func, 5, "func(r uint8, g uint8, b uint8) (uint8, uint8, uint8, uint8)"},
  6964  		{"RGBToYCbCr", Func, 0, "func(r uint8, g uint8, b uint8) (uint8, uint8, uint8)"},
  6965  		{"Transparent", Var, 0, ""},
  6966  		{"White", Var, 0, ""},
  6967  		{"YCbCr", Type, 0, ""},
  6968  		{"YCbCr.Cb", Field, 0, ""},
  6969  		{"YCbCr.Cr", Field, 0, ""},
  6970  		{"YCbCr.Y", Field, 0, ""},
  6971  		{"YCbCrModel", Var, 0, ""},
  6972  		{"YCbCrToRGB", Func, 0, "func(y uint8, cb uint8, cr uint8) (uint8, uint8, uint8)"},
  6973  	},
  6974  	"image/color/palette": {
  6975  		{"Plan9", Var, 2, ""},
  6976  		{"WebSafe", Var, 2, ""},
  6977  	},
  6978  	"image/draw": {
  6979  		{"(Op).Draw", Method, 2, ""},
  6980  		{"Draw", Func, 0, "func(dst Image, r image.Rectangle, src image.Image, sp image.Point, op Op)"},
  6981  		{"DrawMask", Func, 0, "func(dst Image, r image.Rectangle, src image.Image, sp image.Point, mask image.Image, mp image.Point, op Op)"},
  6982  		{"Drawer", Type, 2, ""},
  6983  		{"FloydSteinberg", Var, 2, ""},
  6984  		{"Image", Type, 0, ""},
  6985  		{"Op", Type, 0, ""},
  6986  		{"Over", Const, 0, ""},
  6987  		{"Quantizer", Type, 2, ""},
  6988  		{"RGBA64Image", Type, 17, ""},
  6989  		{"Src", Const, 0, ""},
  6990  	},
  6991  	"image/gif": {
  6992  		{"Decode", Func, 0, "func(r io.Reader) (image.Image, error)"},
  6993  		{"DecodeAll", Func, 0, "func(r io.Reader) (*GIF, error)"},
  6994  		{"DecodeConfig", Func, 0, "func(r io.Reader) (image.Config, error)"},
  6995  		{"DisposalBackground", Const, 5, ""},
  6996  		{"DisposalNone", Const, 5, ""},
  6997  		{"DisposalPrevious", Const, 5, ""},
  6998  		{"Encode", Func, 2, "func(w io.Writer, m image.Image, o *Options) error"},
  6999  		{"EncodeAll", Func, 2, "func(w io.Writer, g *GIF) error"},
  7000  		{"GIF", Type, 0, ""},
  7001  		{"GIF.BackgroundIndex", Field, 5, ""},
  7002  		{"GIF.Config", Field, 5, ""},
  7003  		{"GIF.Delay", Field, 0, ""},
  7004  		{"GIF.Disposal", Field, 5, ""},
  7005  		{"GIF.Image", Field, 0, ""},
  7006  		{"GIF.LoopCount", Field, 0, ""},
  7007  		{"Options", Type, 2, ""},
  7008  		{"Options.Drawer", Field, 2, ""},
  7009  		{"Options.NumColors", Field, 2, ""},
  7010  		{"Options.Quantizer", Field, 2, ""},
  7011  	},
  7012  	"image/jpeg": {
  7013  		{"(FormatError).Error", Method, 0, ""},
  7014  		{"(UnsupportedError).Error", Method, 0, ""},
  7015  		{"Decode", Func, 0, "func(r io.Reader) (image.Image, error)"},
  7016  		{"DecodeConfig", Func, 0, "func(r io.Reader) (image.Config, error)"},
  7017  		{"DefaultQuality", Const, 0, ""},
  7018  		{"Encode", Func, 0, "func(w io.Writer, m image.Image, o *Options) error"},
  7019  		{"FormatError", Type, 0, ""},
  7020  		{"Options", Type, 0, ""},
  7021  		{"Options.Quality", Field, 0, ""},
  7022  		{"Reader", Type, 0, ""},
  7023  		{"UnsupportedError", Type, 0, ""},
  7024  	},
  7025  	"image/png": {
  7026  		{"(*Encoder).Encode", Method, 4, ""},
  7027  		{"(FormatError).Error", Method, 0, ""},
  7028  		{"(UnsupportedError).Error", Method, 0, ""},
  7029  		{"BestCompression", Const, 4, ""},
  7030  		{"BestSpeed", Const, 4, ""},
  7031  		{"CompressionLevel", Type, 4, ""},
  7032  		{"Decode", Func, 0, "func(r io.Reader) (image.Image, error)"},
  7033  		{"DecodeConfig", Func, 0, "func(r io.Reader) (image.Config, error)"},
  7034  		{"DefaultCompression", Const, 4, ""},
  7035  		{"Encode", Func, 0, "func(w io.Writer, m image.Image) error"},
  7036  		{"Encoder", Type, 4, ""},
  7037  		{"Encoder.BufferPool", Field, 9, ""},
  7038  		{"Encoder.CompressionLevel", Field, 4, ""},
  7039  		{"EncoderBuffer", Type, 9, ""},
  7040  		{"EncoderBufferPool", Type, 9, ""},
  7041  		{"FormatError", Type, 0, ""},
  7042  		{"NoCompression", Const, 4, ""},
  7043  		{"UnsupportedError", Type, 0, ""},
  7044  	},
  7045  	"index/suffixarray": {
  7046  		{"(*Index).Bytes", Method, 0, ""},
  7047  		{"(*Index).FindAllIndex", Method, 0, ""},
  7048  		{"(*Index).Lookup", Method, 0, ""},
  7049  		{"(*Index).Read", Method, 0, ""},
  7050  		{"(*Index).Write", Method, 0, ""},
  7051  		{"Index", Type, 0, ""},
  7052  		{"New", Func, 0, "func(data []byte) *Index"},
  7053  	},
  7054  	"io": {
  7055  		{"(*LimitedReader).Read", Method, 0, ""},
  7056  		{"(*OffsetWriter).Seek", Method, 20, ""},
  7057  		{"(*OffsetWriter).Write", Method, 20, ""},
  7058  		{"(*OffsetWriter).WriteAt", Method, 20, ""},
  7059  		{"(*PipeReader).Close", Method, 0, ""},
  7060  		{"(*PipeReader).CloseWithError", Method, 0, ""},
  7061  		{"(*PipeReader).Read", Method, 0, ""},
  7062  		{"(*PipeWriter).Close", Method, 0, ""},
  7063  		{"(*PipeWriter).CloseWithError", Method, 0, ""},
  7064  		{"(*PipeWriter).Write", Method, 0, ""},
  7065  		{"(*SectionReader).Outer", Method, 22, ""},
  7066  		{"(*SectionReader).Read", Method, 0, ""},
  7067  		{"(*SectionReader).ReadAt", Method, 0, ""},
  7068  		{"(*SectionReader).Seek", Method, 0, ""},
  7069  		{"(*SectionReader).Size", Method, 0, ""},
  7070  		{"ByteReader", Type, 0, ""},
  7071  		{"ByteScanner", Type, 0, ""},
  7072  		{"ByteWriter", Type, 1, ""},
  7073  		{"Closer", Type, 0, ""},
  7074  		{"Copy", Func, 0, "func(dst Writer, src Reader) (written int64, err error)"},
  7075  		{"CopyBuffer", Func, 5, "func(dst Writer, src Reader, buf []byte) (written int64, err error)"},
  7076  		{"CopyN", Func, 0, "func(dst Writer, src Reader, n int64) (written int64, err error)"},
  7077  		{"Discard", Var, 16, ""},
  7078  		{"EOF", Var, 0, ""},
  7079  		{"ErrClosedPipe", Var, 0, ""},
  7080  		{"ErrNoProgress", Var, 1, ""},
  7081  		{"ErrShortBuffer", Var, 0, ""},
  7082  		{"ErrShortWrite", Var, 0, ""},
  7083  		{"ErrUnexpectedEOF", Var, 0, ""},
  7084  		{"LimitReader", Func, 0, "func(r Reader, n int64) Reader"},
  7085  		{"LimitedReader", Type, 0, ""},
  7086  		{"LimitedReader.N", Field, 0, ""},
  7087  		{"LimitedReader.R", Field, 0, ""},
  7088  		{"MultiReader", Func, 0, "func(readers ...Reader) Reader"},
  7089  		{"MultiWriter", Func, 0, "func(writers ...Writer) Writer"},
  7090  		{"NewOffsetWriter", Func, 20, "func(w WriterAt, off int64) *OffsetWriter"},
  7091  		{"NewSectionReader", Func, 0, "func(r ReaderAt, off int64, n int64) *SectionReader"},
  7092  		{"NopCloser", Func, 16, "func(r Reader) ReadCloser"},
  7093  		{"OffsetWriter", Type, 20, ""},
  7094  		{"Pipe", Func, 0, "func() (*PipeReader, *PipeWriter)"},
  7095  		{"PipeReader", Type, 0, ""},
  7096  		{"PipeWriter", Type, 0, ""},
  7097  		{"ReadAll", Func, 16, "func(r Reader) ([]byte, error)"},
  7098  		{"ReadAtLeast", Func, 0, "func(r Reader, buf []byte, min int) (n int, err error)"},
  7099  		{"ReadCloser", Type, 0, ""},
  7100  		{"ReadFull", Func, 0, "func(r Reader, buf []byte) (n int, err error)"},
  7101  		{"ReadSeekCloser", Type, 16, ""},
  7102  		{"ReadSeeker", Type, 0, ""},
  7103  		{"ReadWriteCloser", Type, 0, ""},
  7104  		{"ReadWriteSeeker", Type, 0, ""},
  7105  		{"ReadWriter", Type, 0, ""},
  7106  		{"Reader", Type, 0, ""},
  7107  		{"ReaderAt", Type, 0, ""},
  7108  		{"ReaderFrom", Type, 0, ""},
  7109  		{"RuneReader", Type, 0, ""},
  7110  		{"RuneScanner", Type, 0, ""},
  7111  		{"SectionReader", Type, 0, ""},
  7112  		{"SeekCurrent", Const, 7, ""},
  7113  		{"SeekEnd", Const, 7, ""},
  7114  		{"SeekStart", Const, 7, ""},
  7115  		{"Seeker", Type, 0, ""},
  7116  		{"StringWriter", Type, 12, ""},
  7117  		{"TeeReader", Func, 0, "func(r Reader, w Writer) Reader"},
  7118  		{"WriteCloser", Type, 0, ""},
  7119  		{"WriteSeeker", Type, 0, ""},
  7120  		{"WriteString", Func, 0, "func(w Writer, s string) (n int, err error)"},
  7121  		{"Writer", Type, 0, ""},
  7122  		{"WriterAt", Type, 0, ""},
  7123  		{"WriterTo", Type, 0, ""},
  7124  	},
  7125  	"io/fs": {
  7126  		{"(*PathError).Error", Method, 16, ""},
  7127  		{"(*PathError).Timeout", Method, 16, ""},
  7128  		{"(*PathError).Unwrap", Method, 16, ""},
  7129  		{"(FileMode).IsDir", Method, 16, ""},
  7130  		{"(FileMode).IsRegular", Method, 16, ""},
  7131  		{"(FileMode).Perm", Method, 16, ""},
  7132  		{"(FileMode).String", Method, 16, ""},
  7133  		{"(FileMode).Type", Method, 16, ""},
  7134  		{"DirEntry", Type, 16, ""},
  7135  		{"ErrClosed", Var, 16, ""},
  7136  		{"ErrExist", Var, 16, ""},
  7137  		{"ErrInvalid", Var, 16, ""},
  7138  		{"ErrNotExist", Var, 16, ""},
  7139  		{"ErrPermission", Var, 16, ""},
  7140  		{"FS", Type, 16, ""},
  7141  		{"File", Type, 16, ""},
  7142  		{"FileInfo", Type, 16, ""},
  7143  		{"FileInfoToDirEntry", Func, 17, "func(info FileInfo) DirEntry"},
  7144  		{"FileMode", Type, 16, ""},
  7145  		{"FormatDirEntry", Func, 21, "func(dir DirEntry) string"},
  7146  		{"FormatFileInfo", Func, 21, "func(info FileInfo) string"},
  7147  		{"Glob", Func, 16, "func(fsys FS, pattern string) (matches []string, err error)"},
  7148  		{"GlobFS", Type, 16, ""},
  7149  		{"Lstat", Func, 25, "func(fsys FS, name string) (FileInfo, error)"},
  7150  		{"ModeAppend", Const, 16, ""},
  7151  		{"ModeCharDevice", Const, 16, ""},
  7152  		{"ModeDevice", Const, 16, ""},
  7153  		{"ModeDir", Const, 16, ""},
  7154  		{"ModeExclusive", Const, 16, ""},
  7155  		{"ModeIrregular", Const, 16, ""},
  7156  		{"ModeNamedPipe", Const, 16, ""},
  7157  		{"ModePerm", Const, 16, ""},
  7158  		{"ModeSetgid", Const, 16, ""},
  7159  		{"ModeSetuid", Const, 16, ""},
  7160  		{"ModeSocket", Const, 16, ""},
  7161  		{"ModeSticky", Const, 16, ""},
  7162  		{"ModeSymlink", Const, 16, ""},
  7163  		{"ModeTemporary", Const, 16, ""},
  7164  		{"ModeType", Const, 16, ""},
  7165  		{"PathError", Type, 16, ""},
  7166  		{"PathError.Err", Field, 16, ""},
  7167  		{"PathError.Op", Field, 16, ""},
  7168  		{"PathError.Path", Field, 16, ""},
  7169  		{"ReadDir", Func, 16, "func(fsys FS, name string) ([]DirEntry, error)"},
  7170  		{"ReadDirFS", Type, 16, ""},
  7171  		{"ReadDirFile", Type, 16, ""},
  7172  		{"ReadFile", Func, 16, "func(fsys FS, name string) ([]byte, error)"},
  7173  		{"ReadFileFS", Type, 16, ""},
  7174  		{"ReadLink", Func, 25, "func(fsys FS, name string) (string, error)"},
  7175  		{"ReadLinkFS", Type, 25, ""},
  7176  		{"SkipAll", Var, 20, ""},
  7177  		{"SkipDir", Var, 16, ""},
  7178  		{"Stat", Func, 16, "func(fsys FS, name string) (FileInfo, error)"},
  7179  		{"StatFS", Type, 16, ""},
  7180  		{"Sub", Func, 16, "func(fsys FS, dir string) (FS, error)"},
  7181  		{"SubFS", Type, 16, ""},
  7182  		{"ValidPath", Func, 16, "func(name string) bool"},
  7183  		{"WalkDir", Func, 16, "func(fsys FS, root string, fn WalkDirFunc) error"},
  7184  		{"WalkDirFunc", Type, 16, ""},
  7185  	},
  7186  	"io/ioutil": {
  7187  		{"Discard", Var, 0, ""},
  7188  		{"NopCloser", Func, 0, "func(r io.Reader) io.ReadCloser"},
  7189  		{"ReadAll", Func, 0, "func(r io.Reader) ([]byte, error)"},
  7190  		{"ReadDir", Func, 0, "func(dirname string) ([]fs.FileInfo, error)"},
  7191  		{"ReadFile", Func, 0, "func(filename string) ([]byte, error)"},
  7192  		{"TempDir", Func, 0, "func(dir string, pattern string) (name string, err error)"},
  7193  		{"TempFile", Func, 0, "func(dir string, pattern string) (f *os.File, err error)"},
  7194  		{"WriteFile", Func, 0, "func(filename string, data []byte, perm fs.FileMode) error"},
  7195  	},
  7196  	"iter": {
  7197  		{"Pull", Func, 23, "func[V any](seq Seq[V]) (next func() (V, bool), stop func())"},
  7198  		{"Pull2", Func, 23, "func[K, V any](seq Seq2[K, V]) (next func() (K, V, bool), stop func())"},
  7199  		{"Seq", Type, 23, ""},
  7200  		{"Seq2", Type, 23, ""},
  7201  	},
  7202  	"log": {
  7203  		{"(*Logger).Fatal", Method, 0, ""},
  7204  		{"(*Logger).Fatalf", Method, 0, ""},
  7205  		{"(*Logger).Fatalln", Method, 0, ""},
  7206  		{"(*Logger).Flags", Method, 0, ""},
  7207  		{"(*Logger).Output", Method, 0, ""},
  7208  		{"(*Logger).Panic", Method, 0, ""},
  7209  		{"(*Logger).Panicf", Method, 0, ""},
  7210  		{"(*Logger).Panicln", Method, 0, ""},
  7211  		{"(*Logger).Prefix", Method, 0, ""},
  7212  		{"(*Logger).Print", Method, 0, ""},
  7213  		{"(*Logger).Printf", Method, 0, ""},
  7214  		{"(*Logger).Println", Method, 0, ""},
  7215  		{"(*Logger).SetFlags", Method, 0, ""},
  7216  		{"(*Logger).SetOutput", Method, 5, ""},
  7217  		{"(*Logger).SetPrefix", Method, 0, ""},
  7218  		{"(*Logger).Writer", Method, 12, ""},
  7219  		{"Default", Func, 16, "func() *Logger"},
  7220  		{"Fatal", Func, 0, "func(v ...any)"},
  7221  		{"Fatalf", Func, 0, "func(format string, v ...any)"},
  7222  		{"Fatalln", Func, 0, "func(v ...any)"},
  7223  		{"Flags", Func, 0, "func() int"},
  7224  		{"LUTC", Const, 5, ""},
  7225  		{"Ldate", Const, 0, ""},
  7226  		{"Llongfile", Const, 0, ""},
  7227  		{"Lmicroseconds", Const, 0, ""},
  7228  		{"Lmsgprefix", Const, 14, ""},
  7229  		{"Logger", Type, 0, ""},
  7230  		{"Lshortfile", Const, 0, ""},
  7231  		{"LstdFlags", Const, 0, ""},
  7232  		{"Ltime", Const, 0, ""},
  7233  		{"New", Func, 0, "func(out io.Writer, prefix string, flag int) *Logger"},
  7234  		{"Output", Func, 5, "func(calldepth int, s string) error"},
  7235  		{"Panic", Func, 0, "func(v ...any)"},
  7236  		{"Panicf", Func, 0, "func(format string, v ...any)"},
  7237  		{"Panicln", Func, 0, "func(v ...any)"},
  7238  		{"Prefix", Func, 0, "func() string"},
  7239  		{"Print", Func, 0, "func(v ...any)"},
  7240  		{"Printf", Func, 0, "func(format string, v ...any)"},
  7241  		{"Println", Func, 0, "func(v ...any)"},
  7242  		{"SetFlags", Func, 0, "func(flag int)"},
  7243  		{"SetOutput", Func, 0, "func(w io.Writer)"},
  7244  		{"SetPrefix", Func, 0, "func(prefix string)"},
  7245  		{"Writer", Func, 13, "func() io.Writer"},
  7246  	},
  7247  	"log/slog": {
  7248  		{"(*JSONHandler).Enabled", Method, 21, ""},
  7249  		{"(*JSONHandler).Handle", Method, 21, ""},
  7250  		{"(*JSONHandler).WithAttrs", Method, 21, ""},
  7251  		{"(*JSONHandler).WithGroup", Method, 21, ""},
  7252  		{"(*Level).UnmarshalJSON", Method, 21, ""},
  7253  		{"(*Level).UnmarshalText", Method, 21, ""},
  7254  		{"(*LevelVar).AppendText", Method, 24, ""},
  7255  		{"(*LevelVar).Level", Method, 21, ""},
  7256  		{"(*LevelVar).MarshalText", Method, 21, ""},
  7257  		{"(*LevelVar).Set", Method, 21, ""},
  7258  		{"(*LevelVar).String", Method, 21, ""},
  7259  		{"(*LevelVar).UnmarshalText", Method, 21, ""},
  7260  		{"(*Logger).Debug", Method, 21, ""},
  7261  		{"(*Logger).DebugContext", Method, 21, ""},
  7262  		{"(*Logger).Enabled", Method, 21, ""},
  7263  		{"(*Logger).Error", Method, 21, ""},
  7264  		{"(*Logger).ErrorContext", Method, 21, ""},
  7265  		{"(*Logger).Handler", Method, 21, ""},
  7266  		{"(*Logger).Info", Method, 21, ""},
  7267  		{"(*Logger).InfoContext", Method, 21, ""},
  7268  		{"(*Logger).Log", Method, 21, ""},
  7269  		{"(*Logger).LogAttrs", Method, 21, ""},
  7270  		{"(*Logger).Warn", Method, 21, ""},
  7271  		{"(*Logger).WarnContext", Method, 21, ""},
  7272  		{"(*Logger).With", Method, 21, ""},
  7273  		{"(*Logger).WithGroup", Method, 21, ""},
  7274  		{"(*Record).Add", Method, 21, ""},
  7275  		{"(*Record).AddAttrs", Method, 21, ""},
  7276  		{"(*TextHandler).Enabled", Method, 21, ""},
  7277  		{"(*TextHandler).Handle", Method, 21, ""},
  7278  		{"(*TextHandler).WithAttrs", Method, 21, ""},
  7279  		{"(*TextHandler).WithGroup", Method, 21, ""},
  7280  		{"(Attr).Equal", Method, 21, ""},
  7281  		{"(Attr).String", Method, 21, ""},
  7282  		{"(Kind).String", Method, 21, ""},
  7283  		{"(Level).AppendText", Method, 24, ""},
  7284  		{"(Level).Level", Method, 21, ""},
  7285  		{"(Level).MarshalJSON", Method, 21, ""},
  7286  		{"(Level).MarshalText", Method, 21, ""},
  7287  		{"(Level).String", Method, 21, ""},
  7288  		{"(Record).Attrs", Method, 21, ""},
  7289  		{"(Record).Clone", Method, 21, ""},
  7290  		{"(Record).NumAttrs", Method, 21, ""},
  7291  		{"(Record).Source", Method, 25, ""},
  7292  		{"(Value).Any", Method, 21, ""},
  7293  		{"(Value).Bool", Method, 21, ""},
  7294  		{"(Value).Duration", Method, 21, ""},
  7295  		{"(Value).Equal", Method, 21, ""},
  7296  		{"(Value).Float64", Method, 21, ""},
  7297  		{"(Value).Group", Method, 21, ""},
  7298  		{"(Value).Int64", Method, 21, ""},
  7299  		{"(Value).Kind", Method, 21, ""},
  7300  		{"(Value).LogValuer", Method, 21, ""},
  7301  		{"(Value).Resolve", Method, 21, ""},
  7302  		{"(Value).String", Method, 21, ""},
  7303  		{"(Value).Time", Method, 21, ""},
  7304  		{"(Value).Uint64", Method, 21, ""},
  7305  		{"Any", Func, 21, "func(key string, value any) Attr"},
  7306  		{"AnyValue", Func, 21, "func(v any) Value"},
  7307  		{"Attr", Type, 21, ""},
  7308  		{"Attr.Key", Field, 21, ""},
  7309  		{"Attr.Value", Field, 21, ""},
  7310  		{"Bool", Func, 21, "func(key string, v bool) Attr"},
  7311  		{"BoolValue", Func, 21, "func(v bool) Value"},
  7312  		{"Debug", Func, 21, "func(msg string, args ...any)"},
  7313  		{"DebugContext", Func, 21, "func(ctx context.Context, msg string, args ...any)"},
  7314  		{"Default", Func, 21, "func() *Logger"},
  7315  		{"DiscardHandler", Var, 24, ""},
  7316  		{"Duration", Func, 21, "func(key string, v time.Duration) Attr"},
  7317  		{"DurationValue", Func, 21, "func(v time.Duration) Value"},
  7318  		{"Error", Func, 21, "func(msg string, args ...any)"},
  7319  		{"ErrorContext", Func, 21, "func(ctx context.Context, msg string, args ...any)"},
  7320  		{"Float64", Func, 21, "func(key string, v float64) Attr"},
  7321  		{"Float64Value", Func, 21, "func(v float64) Value"},
  7322  		{"Group", Func, 21, "func(key string, args ...any) Attr"},
  7323  		{"GroupAttrs", Func, 25, "func(key string, attrs ...Attr) Attr"},
  7324  		{"GroupValue", Func, 21, "func(as ...Attr) Value"},
  7325  		{"Handler", Type, 21, ""},
  7326  		{"HandlerOptions", Type, 21, ""},
  7327  		{"HandlerOptions.AddSource", Field, 21, ""},
  7328  		{"HandlerOptions.Level", Field, 21, ""},
  7329  		{"HandlerOptions.ReplaceAttr", Field, 21, ""},
  7330  		{"Info", Func, 21, "func(msg string, args ...any)"},
  7331  		{"InfoContext", Func, 21, "func(ctx context.Context, msg string, args ...any)"},
  7332  		{"Int", Func, 21, "func(key string, value int) Attr"},
  7333  		{"Int64", Func, 21, "func(key string, value int64) Attr"},
  7334  		{"Int64Value", Func, 21, "func(v int64) Value"},
  7335  		{"IntValue", Func, 21, "func(v int) Value"},
  7336  		{"JSONHandler", Type, 21, ""},
  7337  		{"Kind", Type, 21, ""},
  7338  		{"KindAny", Const, 21, ""},
  7339  		{"KindBool", Const, 21, ""},
  7340  		{"KindDuration", Const, 21, ""},
  7341  		{"KindFloat64", Const, 21, ""},
  7342  		{"KindGroup", Const, 21, ""},
  7343  		{"KindInt64", Const, 21, ""},
  7344  		{"KindLogValuer", Const, 21, ""},
  7345  		{"KindString", Const, 21, ""},
  7346  		{"KindTime", Const, 21, ""},
  7347  		{"KindUint64", Const, 21, ""},
  7348  		{"Level", Type, 21, ""},
  7349  		{"LevelDebug", Const, 21, ""},
  7350  		{"LevelError", Const, 21, ""},
  7351  		{"LevelInfo", Const, 21, ""},
  7352  		{"LevelKey", Const, 21, ""},
  7353  		{"LevelVar", Type, 21, ""},
  7354  		{"LevelWarn", Const, 21, ""},
  7355  		{"Leveler", Type, 21, ""},
  7356  		{"Log", Func, 21, "func(ctx context.Context, level Level, msg string, args ...any)"},
  7357  		{"LogAttrs", Func, 21, "func(ctx context.Context, level Level, msg string, attrs ...Attr)"},
  7358  		{"LogValuer", Type, 21, ""},
  7359  		{"Logger", Type, 21, ""},
  7360  		{"MessageKey", Const, 21, ""},
  7361  		{"New", Func, 21, "func(h Handler) *Logger"},
  7362  		{"NewJSONHandler", Func, 21, "func(w io.Writer, opts *HandlerOptions) *JSONHandler"},
  7363  		{"NewLogLogger", Func, 21, "func(h Handler, level Level) *log.Logger"},
  7364  		{"NewRecord", Func, 21, "func(t time.Time, level Level, msg string, pc uintptr) Record"},
  7365  		{"NewTextHandler", Func, 21, "func(w io.Writer, opts *HandlerOptions) *TextHandler"},
  7366  		{"Record", Type, 21, ""},
  7367  		{"Record.Level", Field, 21, ""},
  7368  		{"Record.Message", Field, 21, ""},
  7369  		{"Record.PC", Field, 21, ""},
  7370  		{"Record.Time", Field, 21, ""},
  7371  		{"SetDefault", Func, 21, "func(l *Logger)"},
  7372  		{"SetLogLoggerLevel", Func, 22, "func(level Level) (oldLevel Level)"},
  7373  		{"Source", Type, 21, ""},
  7374  		{"Source.File", Field, 21, ""},
  7375  		{"Source.Function", Field, 21, ""},
  7376  		{"Source.Line", Field, 21, ""},
  7377  		{"SourceKey", Const, 21, ""},
  7378  		{"String", Func, 21, "func(key string, value string) Attr"},
  7379  		{"StringValue", Func, 21, "func(value string) Value"},
  7380  		{"TextHandler", Type, 21, ""},
  7381  		{"Time", Func, 21, "func(key string, v time.Time) Attr"},
  7382  		{"TimeKey", Const, 21, ""},
  7383  		{"TimeValue", Func, 21, "func(v time.Time) Value"},
  7384  		{"Uint64", Func, 21, "func(key string, v uint64) Attr"},
  7385  		{"Uint64Value", Func, 21, "func(v uint64) Value"},
  7386  		{"Value", Type, 21, ""},
  7387  		{"Warn", Func, 21, "func(msg string, args ...any)"},
  7388  		{"WarnContext", Func, 21, "func(ctx context.Context, msg string, args ...any)"},
  7389  		{"With", Func, 21, "func(args ...any) *Logger"},
  7390  	},
  7391  	"log/syslog": {
  7392  		{"(*Writer).Alert", Method, 0, ""},
  7393  		{"(*Writer).Close", Method, 0, ""},
  7394  		{"(*Writer).Crit", Method, 0, ""},
  7395  		{"(*Writer).Debug", Method, 0, ""},
  7396  		{"(*Writer).Emerg", Method, 0, ""},
  7397  		{"(*Writer).Err", Method, 0, ""},
  7398  		{"(*Writer).Info", Method, 0, ""},
  7399  		{"(*Writer).Notice", Method, 0, ""},
  7400  		{"(*Writer).Warning", Method, 0, ""},
  7401  		{"(*Writer).Write", Method, 0, ""},
  7402  		{"Dial", Func, 0, "func(network string, raddr string, priority Priority, tag string) (*Writer, error)"},
  7403  		{"LOG_ALERT", Const, 0, ""},
  7404  		{"LOG_AUTH", Const, 1, ""},
  7405  		{"LOG_AUTHPRIV", Const, 1, ""},
  7406  		{"LOG_CRIT", Const, 0, ""},
  7407  		{"LOG_CRON", Const, 1, ""},
  7408  		{"LOG_DAEMON", Const, 1, ""},
  7409  		{"LOG_DEBUG", Const, 0, ""},
  7410  		{"LOG_EMERG", Const, 0, ""},
  7411  		{"LOG_ERR", Const, 0, ""},
  7412  		{"LOG_FTP", Const, 1, ""},
  7413  		{"LOG_INFO", Const, 0, ""},
  7414  		{"LOG_KERN", Const, 1, ""},
  7415  		{"LOG_LOCAL0", Const, 1, ""},
  7416  		{"LOG_LOCAL1", Const, 1, ""},
  7417  		{"LOG_LOCAL2", Const, 1, ""},
  7418  		{"LOG_LOCAL3", Const, 1, ""},
  7419  		{"LOG_LOCAL4", Const, 1, ""},
  7420  		{"LOG_LOCAL5", Const, 1, ""},
  7421  		{"LOG_LOCAL6", Const, 1, ""},
  7422  		{"LOG_LOCAL7", Const, 1, ""},
  7423  		{"LOG_LPR", Const, 1, ""},
  7424  		{"LOG_MAIL", Const, 1, ""},
  7425  		{"LOG_NEWS", Const, 1, ""},
  7426  		{"LOG_NOTICE", Const, 0, ""},
  7427  		{"LOG_SYSLOG", Const, 1, ""},
  7428  		{"LOG_USER", Const, 1, ""},
  7429  		{"LOG_UUCP", Const, 1, ""},
  7430  		{"LOG_WARNING", Const, 0, ""},
  7431  		{"New", Func, 0, "func(priority Priority, tag string) (*Writer, error)"},
  7432  		{"NewLogger", Func, 0, "func(p Priority, logFlag int) (*log.Logger, error)"},
  7433  		{"Priority", Type, 0, ""},
  7434  		{"Writer", Type, 0, ""},
  7435  	},
  7436  	"maps": {
  7437  		{"All", Func, 23, "func[Map ~map[K]V, K comparable, V any](m Map) iter.Seq2[K, V]"},
  7438  		{"Clone", Func, 21, "func[M ~map[K]V, K comparable, V any](m M) M"},
  7439  		{"Collect", Func, 23, "func[K comparable, V any](seq iter.Seq2[K, V]) map[K]V"},
  7440  		{"Copy", Func, 21, "func[M1 ~map[K]V, M2 ~map[K]V, K comparable, V any](dst M1, src M2)"},
  7441  		{"DeleteFunc", Func, 21, "func[M ~map[K]V, K comparable, V any](m M, del func(K, V) bool)"},
  7442  		{"Equal", Func, 21, "func[M1, M2 ~map[K]V, K, V comparable](m1 M1, m2 M2) bool"},
  7443  		{"EqualFunc", Func, 21, "func[M1 ~map[K]V1, M2 ~map[K]V2, K comparable, V1, V2 any](m1 M1, m2 M2, eq func(V1, V2) bool) bool"},
  7444  		{"Insert", Func, 23, "func[Map ~map[K]V, K comparable, V any](m Map, seq iter.Seq2[K, V])"},
  7445  		{"Keys", Func, 23, "func[Map ~map[K]V, K comparable, V any](m Map) iter.Seq[K]"},
  7446  		{"Values", Func, 23, "func[Map ~map[K]V, K comparable, V any](m Map) iter.Seq[V]"},
  7447  	},
  7448  	"math": {
  7449  		{"Abs", Func, 0, "func(x float64) float64"},
  7450  		{"Acos", Func, 0, "func(x float64) float64"},
  7451  		{"Acosh", Func, 0, "func(x float64) float64"},
  7452  		{"Asin", Func, 0, "func(x float64) float64"},
  7453  		{"Asinh", Func, 0, "func(x float64) float64"},
  7454  		{"Atan", Func, 0, "func(x float64) float64"},
  7455  		{"Atan2", Func, 0, "func(y float64, x float64) float64"},
  7456  		{"Atanh", Func, 0, "func(x float64) float64"},
  7457  		{"Cbrt", Func, 0, "func(x float64) float64"},
  7458  		{"Ceil", Func, 0, "func(x float64) float64"},
  7459  		{"Copysign", Func, 0, "func(f float64, sign float64) float64"},
  7460  		{"Cos", Func, 0, "func(x float64) float64"},
  7461  		{"Cosh", Func, 0, "func(x float64) float64"},
  7462  		{"Dim", Func, 0, "func(x float64, y float64) float64"},
  7463  		{"E", Const, 0, ""},
  7464  		{"Erf", Func, 0, "func(x float64) float64"},
  7465  		{"Erfc", Func, 0, "func(x float64) float64"},
  7466  		{"Erfcinv", Func, 10, "func(x float64) float64"},
  7467  		{"Erfinv", Func, 10, "func(x float64) float64"},
  7468  		{"Exp", Func, 0, "func(x float64) float64"},
  7469  		{"Exp2", Func, 0, "func(x float64) float64"},
  7470  		{"Expm1", Func, 0, "func(x float64) float64"},
  7471  		{"FMA", Func, 14, "func(x float64, y float64, z float64) float64"},
  7472  		{"Float32bits", Func, 0, "func(f float32) uint32"},
  7473  		{"Float32frombits", Func, 0, "func(b uint32) float32"},
  7474  		{"Float64bits", Func, 0, "func(f float64) uint64"},
  7475  		{"Float64frombits", Func, 0, "func(b uint64) float64"},
  7476  		{"Floor", Func, 0, "func(x float64) float64"},
  7477  		{"Frexp", Func, 0, "func(f float64) (frac float64, exp int)"},
  7478  		{"Gamma", Func, 0, "func(x float64) float64"},
  7479  		{"Hypot", Func, 0, "func(p float64, q float64) float64"},
  7480  		{"Ilogb", Func, 0, "func(x float64) int"},
  7481  		{"Inf", Func, 0, "func(sign int) float64"},
  7482  		{"IsInf", Func, 0, "func(f float64, sign int) bool"},
  7483  		{"IsNaN", Func, 0, "func(f float64) (is bool)"},
  7484  		{"J0", Func, 0, "func(x float64) float64"},
  7485  		{"J1", Func, 0, "func(x float64) float64"},
  7486  		{"Jn", Func, 0, "func(n int, x float64) float64"},
  7487  		{"Ldexp", Func, 0, "func(frac float64, exp int) float64"},
  7488  		{"Lgamma", Func, 0, "func(x float64) (lgamma float64, sign int)"},
  7489  		{"Ln10", Const, 0, ""},
  7490  		{"Ln2", Const, 0, ""},
  7491  		{"Log", Func, 0, "func(x float64) float64"},
  7492  		{"Log10", Func, 0, "func(x float64) float64"},
  7493  		{"Log10E", Const, 0, ""},
  7494  		{"Log1p", Func, 0, "func(x float64) float64"},
  7495  		{"Log2", Func, 0, "func(x float64) float64"},
  7496  		{"Log2E", Const, 0, ""},
  7497  		{"Logb", Func, 0, "func(x float64) float64"},
  7498  		{"Max", Func, 0, "func(x float64, y float64) float64"},
  7499  		{"MaxFloat32", Const, 0, ""},
  7500  		{"MaxFloat64", Const, 0, ""},
  7501  		{"MaxInt", Const, 17, ""},
  7502  		{"MaxInt16", Const, 0, ""},
  7503  		{"MaxInt32", Const, 0, ""},
  7504  		{"MaxInt64", Const, 0, ""},
  7505  		{"MaxInt8", Const, 0, ""},
  7506  		{"MaxUint", Const, 17, ""},
  7507  		{"MaxUint16", Const, 0, ""},
  7508  		{"MaxUint32", Const, 0, ""},
  7509  		{"MaxUint64", Const, 0, ""},
  7510  		{"MaxUint8", Const, 0, ""},
  7511  		{"Min", Func, 0, "func(x float64, y float64) float64"},
  7512  		{"MinInt", Const, 17, ""},
  7513  		{"MinInt16", Const, 0, ""},
  7514  		{"MinInt32", Const, 0, ""},
  7515  		{"MinInt64", Const, 0, ""},
  7516  		{"MinInt8", Const, 0, ""},
  7517  		{"Mod", Func, 0, "func(x float64, y float64) float64"},
  7518  		{"Modf", Func, 0, "func(f float64) (int float64, frac float64)"},
  7519  		{"NaN", Func, 0, "func() float64"},
  7520  		{"Nextafter", Func, 0, "func(x float64, y float64) (r float64)"},
  7521  		{"Nextafter32", Func, 4, "func(x float32, y float32) (r float32)"},
  7522  		{"Phi", Const, 0, ""},
  7523  		{"Pi", Const, 0, ""},
  7524  		{"Pow", Func, 0, "func(x float64, y float64) float64"},
  7525  		{"Pow10", Func, 0, "func(n int) float64"},
  7526  		{"Remainder", Func, 0, "func(x float64, y float64) float64"},
  7527  		{"Round", Func, 10, "func(x float64) float64"},
  7528  		{"RoundToEven", Func, 10, "func(x float64) float64"},
  7529  		{"Signbit", Func, 0, "func(x float64) bool"},
  7530  		{"Sin", Func, 0, "func(x float64) float64"},
  7531  		{"Sincos", Func, 0, "func(x float64) (sin float64, cos float64)"},
  7532  		{"Sinh", Func, 0, "func(x float64) float64"},
  7533  		{"SmallestNonzeroFloat32", Const, 0, ""},
  7534  		{"SmallestNonzeroFloat64", Const, 0, ""},
  7535  		{"Sqrt", Func, 0, "func(x float64) float64"},
  7536  		{"Sqrt2", Const, 0, ""},
  7537  		{"SqrtE", Const, 0, ""},
  7538  		{"SqrtPhi", Const, 0, ""},
  7539  		{"SqrtPi", Const, 0, ""},
  7540  		{"Tan", Func, 0, "func(x float64) float64"},
  7541  		{"Tanh", Func, 0, "func(x float64) float64"},
  7542  		{"Trunc", Func, 0, "func(x float64) float64"},
  7543  		{"Y0", Func, 0, "func(x float64) float64"},
  7544  		{"Y1", Func, 0, "func(x float64) float64"},
  7545  		{"Yn", Func, 0, "func(n int, x float64) float64"},
  7546  	},
  7547  	"math/big": {
  7548  		{"(*Float).Abs", Method, 5, ""},
  7549  		{"(*Float).Acc", Method, 5, ""},
  7550  		{"(*Float).Add", Method, 5, ""},
  7551  		{"(*Float).Append", Method, 5, ""},
  7552  		{"(*Float).AppendText", Method, 24, ""},
  7553  		{"(*Float).Cmp", Method, 5, ""},
  7554  		{"(*Float).Copy", Method, 5, ""},
  7555  		{"(*Float).Float32", Method, 5, ""},
  7556  		{"(*Float).Float64", Method, 5, ""},
  7557  		{"(*Float).Format", Method, 5, ""},
  7558  		{"(*Float).GobDecode", Method, 7, ""},
  7559  		{"(*Float).GobEncode", Method, 7, ""},
  7560  		{"(*Float).Int", Method, 5, ""},
  7561  		{"(*Float).Int64", Method, 5, ""},
  7562  		{"(*Float).IsInf", Method, 5, ""},
  7563  		{"(*Float).IsInt", Method, 5, ""},
  7564  		{"(*Float).MantExp", Method, 5, ""},
  7565  		{"(*Float).MarshalText", Method, 6, ""},
  7566  		{"(*Float).MinPrec", Method, 5, ""},
  7567  		{"(*Float).Mode", Method, 5, ""},
  7568  		{"(*Float).Mul", Method, 5, ""},
  7569  		{"(*Float).Neg", Method, 5, ""},
  7570  		{"(*Float).Parse", Method, 5, ""},
  7571  		{"(*Float).Prec", Method, 5, ""},
  7572  		{"(*Float).Quo", Method, 5, ""},
  7573  		{"(*Float).Rat", Method, 5, ""},
  7574  		{"(*Float).Scan", Method, 8, ""},
  7575  		{"(*Float).Set", Method, 5, ""},
  7576  		{"(*Float).SetFloat64", Method, 5, ""},
  7577  		{"(*Float).SetInf", Method, 5, ""},
  7578  		{"(*Float).SetInt", Method, 5, ""},
  7579  		{"(*Float).SetInt64", Method, 5, ""},
  7580  		{"(*Float).SetMantExp", Method, 5, ""},
  7581  		{"(*Float).SetMode", Method, 5, ""},
  7582  		{"(*Float).SetPrec", Method, 5, ""},
  7583  		{"(*Float).SetRat", Method, 5, ""},
  7584  		{"(*Float).SetString", Method, 5, ""},
  7585  		{"(*Float).SetUint64", Method, 5, ""},
  7586  		{"(*Float).Sign", Method, 5, ""},
  7587  		{"(*Float).Signbit", Method, 5, ""},
  7588  		{"(*Float).Sqrt", Method, 10, ""},
  7589  		{"(*Float).String", Method, 5, ""},
  7590  		{"(*Float).Sub", Method, 5, ""},
  7591  		{"(*Float).Text", Method, 5, ""},
  7592  		{"(*Float).Uint64", Method, 5, ""},
  7593  		{"(*Float).UnmarshalText", Method, 6, ""},
  7594  		{"(*Int).Abs", Method, 0, ""},
  7595  		{"(*Int).Add", Method, 0, ""},
  7596  		{"(*Int).And", Method, 0, ""},
  7597  		{"(*Int).AndNot", Method, 0, ""},
  7598  		{"(*Int).Append", Method, 6, ""},
  7599  		{"(*Int).AppendText", Method, 24, ""},
  7600  		{"(*Int).Binomial", Method, 0, ""},
  7601  		{"(*Int).Bit", Method, 0, ""},
  7602  		{"(*Int).BitLen", Method, 0, ""},
  7603  		{"(*Int).Bits", Method, 0, ""},
  7604  		{"(*Int).Bytes", Method, 0, ""},
  7605  		{"(*Int).Cmp", Method, 0, ""},
  7606  		{"(*Int).CmpAbs", Method, 10, ""},
  7607  		{"(*Int).Div", Method, 0, ""},
  7608  		{"(*Int).DivMod", Method, 0, ""},
  7609  		{"(*Int).Exp", Method, 0, ""},
  7610  		{"(*Int).FillBytes", Method, 15, ""},
  7611  		{"(*Int).Float64", Method, 21, ""},
  7612  		{"(*Int).Format", Method, 0, ""},
  7613  		{"(*Int).GCD", Method, 0, ""},
  7614  		{"(*Int).GobDecode", Method, 0, ""},
  7615  		{"(*Int).GobEncode", Method, 0, ""},
  7616  		{"(*Int).Int64", Method, 0, ""},
  7617  		{"(*Int).IsInt64", Method, 9, ""},
  7618  		{"(*Int).IsUint64", Method, 9, ""},
  7619  		{"(*Int).Lsh", Method, 0, ""},
  7620  		{"(*Int).MarshalJSON", Method, 1, ""},
  7621  		{"(*Int).MarshalText", Method, 3, ""},
  7622  		{"(*Int).Mod", Method, 0, ""},
  7623  		{"(*Int).ModInverse", Method, 0, ""},
  7624  		{"(*Int).ModSqrt", Method, 5, ""},
  7625  		{"(*Int).Mul", Method, 0, ""},
  7626  		{"(*Int).MulRange", Method, 0, ""},
  7627  		{"(*Int).Neg", Method, 0, ""},
  7628  		{"(*Int).Not", Method, 0, ""},
  7629  		{"(*Int).Or", Method, 0, ""},
  7630  		{"(*Int).ProbablyPrime", Method, 0, ""},
  7631  		{"(*Int).Quo", Method, 0, ""},
  7632  		{"(*Int).QuoRem", Method, 0, ""},
  7633  		{"(*Int).Rand", Method, 0, ""},
  7634  		{"(*Int).Rem", Method, 0, ""},
  7635  		{"(*Int).Rsh", Method, 0, ""},
  7636  		{"(*Int).Scan", Method, 0, ""},
  7637  		{"(*Int).Set", Method, 0, ""},
  7638  		{"(*Int).SetBit", Method, 0, ""},
  7639  		{"(*Int).SetBits", Method, 0, ""},
  7640  		{"(*Int).SetBytes", Method, 0, ""},
  7641  		{"(*Int).SetInt64", Method, 0, ""},
  7642  		{"(*Int).SetString", Method, 0, ""},
  7643  		{"(*Int).SetUint64", Method, 1, ""},
  7644  		{"(*Int).Sign", Method, 0, ""},
  7645  		{"(*Int).Sqrt", Method, 8, ""},
  7646  		{"(*Int).String", Method, 0, ""},
  7647  		{"(*Int).Sub", Method, 0, ""},
  7648  		{"(*Int).Text", Method, 6, ""},
  7649  		{"(*Int).TrailingZeroBits", Method, 13, ""},
  7650  		{"(*Int).Uint64", Method, 1, ""},
  7651  		{"(*Int).UnmarshalJSON", Method, 1, ""},
  7652  		{"(*Int).UnmarshalText", Method, 3, ""},
  7653  		{"(*Int).Xor", Method, 0, ""},
  7654  		{"(*Rat).Abs", Method, 0, ""},
  7655  		{"(*Rat).Add", Method, 0, ""},
  7656  		{"(*Rat).AppendText", Method, 24, ""},
  7657  		{"(*Rat).Cmp", Method, 0, ""},
  7658  		{"(*Rat).Denom", Method, 0, ""},
  7659  		{"(*Rat).Float32", Method, 4, ""},
  7660  		{"(*Rat).Float64", Method, 1, ""},
  7661  		{"(*Rat).FloatPrec", Method, 22, ""},
  7662  		{"(*Rat).FloatString", Method, 0, ""},
  7663  		{"(*Rat).GobDecode", Method, 0, ""},
  7664  		{"(*Rat).GobEncode", Method, 0, ""},
  7665  		{"(*Rat).Inv", Method, 0, ""},
  7666  		{"(*Rat).IsInt", Method, 0, ""},
  7667  		{"(*Rat).MarshalText", Method, 3, ""},
  7668  		{"(*Rat).Mul", Method, 0, ""},
  7669  		{"(*Rat).Neg", Method, 0, ""},
  7670  		{"(*Rat).Num", Method, 0, ""},
  7671  		{"(*Rat).Quo", Method, 0, ""},
  7672  		{"(*Rat).RatString", Method, 0, ""},
  7673  		{"(*Rat).Scan", Method, 0, ""},
  7674  		{"(*Rat).Set", Method, 0, ""},
  7675  		{"(*Rat).SetFloat64", Method, 1, ""},
  7676  		{"(*Rat).SetFrac", Method, 0, ""},
  7677  		{"(*Rat).SetFrac64", Method, 0, ""},
  7678  		{"(*Rat).SetInt", Method, 0, ""},
  7679  		{"(*Rat).SetInt64", Method, 0, ""},
  7680  		{"(*Rat).SetString", Method, 0, ""},
  7681  		{"(*Rat).SetUint64", Method, 13, ""},
  7682  		{"(*Rat).Sign", Method, 0, ""},
  7683  		{"(*Rat).String", Method, 0, ""},
  7684  		{"(*Rat).Sub", Method, 0, ""},
  7685  		{"(*Rat).UnmarshalText", Method, 3, ""},
  7686  		{"(Accuracy).String", Method, 5, ""},
  7687  		{"(ErrNaN).Error", Method, 5, ""},
  7688  		{"(RoundingMode).String", Method, 5, ""},
  7689  		{"Above", Const, 5, ""},
  7690  		{"Accuracy", Type, 5, ""},
  7691  		{"AwayFromZero", Const, 5, ""},
  7692  		{"Below", Const, 5, ""},
  7693  		{"ErrNaN", Type, 5, ""},
  7694  		{"Exact", Const, 5, ""},
  7695  		{"Float", Type, 5, ""},
  7696  		{"Int", Type, 0, ""},
  7697  		{"Jacobi", Func, 5, "func(x *Int, y *Int) int"},
  7698  		{"MaxBase", Const, 0, ""},
  7699  		{"MaxExp", Const, 5, ""},
  7700  		{"MaxPrec", Const, 5, ""},
  7701  		{"MinExp", Const, 5, ""},
  7702  		{"NewFloat", Func, 5, "func(x float64) *Float"},
  7703  		{"NewInt", Func, 0, "func(x int64) *Int"},
  7704  		{"NewRat", Func, 0, "func(a int64, b int64) *Rat"},
  7705  		{"ParseFloat", Func, 5, "func(s string, base int, prec uint, mode RoundingMode) (f *Float, b int, err error)"},
  7706  		{"Rat", Type, 0, ""},
  7707  		{"RoundingMode", Type, 5, ""},
  7708  		{"ToNearestAway", Const, 5, ""},
  7709  		{"ToNearestEven", Const, 5, ""},
  7710  		{"ToNegativeInf", Const, 5, ""},
  7711  		{"ToPositiveInf", Const, 5, ""},
  7712  		{"ToZero", Const, 5, ""},
  7713  		{"Word", Type, 0, ""},
  7714  	},
  7715  	"math/bits": {
  7716  		{"Add", Func, 12, "func(x uint, y uint, carry uint) (sum uint, carryOut uint)"},
  7717  		{"Add32", Func, 12, "func(x uint32, y uint32, carry uint32) (sum uint32, carryOut uint32)"},
  7718  		{"Add64", Func, 12, "func(x uint64, y uint64, carry uint64) (sum uint64, carryOut uint64)"},
  7719  		{"Div", Func, 12, "func(hi uint, lo uint, y uint) (quo uint, rem uint)"},
  7720  		{"Div32", Func, 12, "func(hi uint32, lo uint32, y uint32) (quo uint32, rem uint32)"},
  7721  		{"Div64", Func, 12, "func(hi uint64, lo uint64, y uint64) (quo uint64, rem uint64)"},
  7722  		{"LeadingZeros", Func, 9, "func(x uint) int"},
  7723  		{"LeadingZeros16", Func, 9, "func(x uint16) int"},
  7724  		{"LeadingZeros32", Func, 9, "func(x uint32) int"},
  7725  		{"LeadingZeros64", Func, 9, "func(x uint64) int"},
  7726  		{"LeadingZeros8", Func, 9, "func(x uint8) int"},
  7727  		{"Len", Func, 9, "func(x uint) int"},
  7728  		{"Len16", Func, 9, "func(x uint16) (n int)"},
  7729  		{"Len32", Func, 9, "func(x uint32) (n int)"},
  7730  		{"Len64", Func, 9, "func(x uint64) (n int)"},
  7731  		{"Len8", Func, 9, "func(x uint8) int"},
  7732  		{"Mul", Func, 12, "func(x uint, y uint) (hi uint, lo uint)"},
  7733  		{"Mul32", Func, 12, "func(x uint32, y uint32) (hi uint32, lo uint32)"},
  7734  		{"Mul64", Func, 12, "func(x uint64, y uint64) (hi uint64, lo uint64)"},
  7735  		{"OnesCount", Func, 9, "func(x uint) int"},
  7736  		{"OnesCount16", Func, 9, "func(x uint16) int"},
  7737  		{"OnesCount32", Func, 9, "func(x uint32) int"},
  7738  		{"OnesCount64", Func, 9, "func(x uint64) int"},
  7739  		{"OnesCount8", Func, 9, "func(x uint8) int"},
  7740  		{"Rem", Func, 14, "func(hi uint, lo uint, y uint) uint"},
  7741  		{"Rem32", Func, 14, "func(hi uint32, lo uint32, y uint32) uint32"},
  7742  		{"Rem64", Func, 14, "func(hi uint64, lo uint64, y uint64) uint64"},
  7743  		{"Reverse", Func, 9, "func(x uint) uint"},
  7744  		{"Reverse16", Func, 9, "func(x uint16) uint16"},
  7745  		{"Reverse32", Func, 9, "func(x uint32) uint32"},
  7746  		{"Reverse64", Func, 9, "func(x uint64) uint64"},
  7747  		{"Reverse8", Func, 9, "func(x uint8) uint8"},
  7748  		{"ReverseBytes", Func, 9, "func(x uint) uint"},
  7749  		{"ReverseBytes16", Func, 9, "func(x uint16) uint16"},
  7750  		{"ReverseBytes32", Func, 9, "func(x uint32) uint32"},
  7751  		{"ReverseBytes64", Func, 9, "func(x uint64) uint64"},
  7752  		{"RotateLeft", Func, 9, "func(x uint, k int) uint"},
  7753  		{"RotateLeft16", Func, 9, "func(x uint16, k int) uint16"},
  7754  		{"RotateLeft32", Func, 9, "func(x uint32, k int) uint32"},
  7755  		{"RotateLeft64", Func, 9, "func(x uint64, k int) uint64"},
  7756  		{"RotateLeft8", Func, 9, "func(x uint8, k int) uint8"},
  7757  		{"Sub", Func, 12, "func(x uint, y uint, borrow uint) (diff uint, borrowOut uint)"},
  7758  		{"Sub32", Func, 12, "func(x uint32, y uint32, borrow uint32) (diff uint32, borrowOut uint32)"},
  7759  		{"Sub64", Func, 12, "func(x uint64, y uint64, borrow uint64) (diff uint64, borrowOut uint64)"},
  7760  		{"TrailingZeros", Func, 9, "func(x uint) int"},
  7761  		{"TrailingZeros16", Func, 9, "func(x uint16) int"},
  7762  		{"TrailingZeros32", Func, 9, "func(x uint32) int"},
  7763  		{"TrailingZeros64", Func, 9, "func(x uint64) int"},
  7764  		{"TrailingZeros8", Func, 9, "func(x uint8) int"},
  7765  		{"UintSize", Const, 9, ""},
  7766  	},
  7767  	"math/cmplx": {
  7768  		{"Abs", Func, 0, "func(x complex128) float64"},
  7769  		{"Acos", Func, 0, "func(x complex128) complex128"},
  7770  		{"Acosh", Func, 0, "func(x complex128) complex128"},
  7771  		{"Asin", Func, 0, "func(x complex128) complex128"},
  7772  		{"Asinh", Func, 0, "func(x complex128) complex128"},
  7773  		{"Atan", Func, 0, "func(x complex128) complex128"},
  7774  		{"Atanh", Func, 0, "func(x complex128) complex128"},
  7775  		{"Conj", Func, 0, "func(x complex128) complex128"},
  7776  		{"Cos", Func, 0, "func(x complex128) complex128"},
  7777  		{"Cosh", Func, 0, "func(x complex128) complex128"},
  7778  		{"Cot", Func, 0, "func(x complex128) complex128"},
  7779  		{"Exp", Func, 0, "func(x complex128) complex128"},
  7780  		{"Inf", Func, 0, "func() complex128"},
  7781  		{"IsInf", Func, 0, "func(x complex128) bool"},
  7782  		{"IsNaN", Func, 0, "func(x complex128) bool"},
  7783  		{"Log", Func, 0, "func(x complex128) complex128"},
  7784  		{"Log10", Func, 0, "func(x complex128) complex128"},
  7785  		{"NaN", Func, 0, "func() complex128"},
  7786  		{"Phase", Func, 0, "func(x complex128) float64"},
  7787  		{"Polar", Func, 0, "func(x complex128) (r float64, θ float64)"},
  7788  		{"Pow", Func, 0, "func(x complex128, y complex128) complex128"},
  7789  		{"Rect", Func, 0, "func(r float64, θ float64) complex128"},
  7790  		{"Sin", Func, 0, "func(x complex128) complex128"},
  7791  		{"Sinh", Func, 0, "func(x complex128) complex128"},
  7792  		{"Sqrt", Func, 0, "func(x complex128) complex128"},
  7793  		{"Tan", Func, 0, "func(x complex128) complex128"},
  7794  		{"Tanh", Func, 0, "func(x complex128) complex128"},
  7795  	},
  7796  	"math/rand": {
  7797  		{"(*Rand).ExpFloat64", Method, 0, ""},
  7798  		{"(*Rand).Float32", Method, 0, ""},
  7799  		{"(*Rand).Float64", Method, 0, ""},
  7800  		{"(*Rand).Int", Method, 0, ""},
  7801  		{"(*Rand).Int31", Method, 0, ""},
  7802  		{"(*Rand).Int31n", Method, 0, ""},
  7803  		{"(*Rand).Int63", Method, 0, ""},
  7804  		{"(*Rand).Int63n", Method, 0, ""},
  7805  		{"(*Rand).Intn", Method, 0, ""},
  7806  		{"(*Rand).NormFloat64", Method, 0, ""},
  7807  		{"(*Rand).Perm", Method, 0, ""},
  7808  		{"(*Rand).Read", Method, 6, ""},
  7809  		{"(*Rand).Seed", Method, 0, ""},
  7810  		{"(*Rand).Shuffle", Method, 10, ""},
  7811  		{"(*Rand).Uint32", Method, 0, ""},
  7812  		{"(*Rand).Uint64", Method, 8, ""},
  7813  		{"(*Zipf).Uint64", Method, 0, ""},
  7814  		{"ExpFloat64", Func, 0, "func() float64"},
  7815  		{"Float32", Func, 0, "func() float32"},
  7816  		{"Float64", Func, 0, "func() float64"},
  7817  		{"Int", Func, 0, "func() int"},
  7818  		{"Int31", Func, 0, "func() int32"},
  7819  		{"Int31n", Func, 0, "func(n int32) int32"},
  7820  		{"Int63", Func, 0, "func() int64"},
  7821  		{"Int63n", Func, 0, "func(n int64) int64"},
  7822  		{"Intn", Func, 0, "func(n int) int"},
  7823  		{"New", Func, 0, "func(src Source) *Rand"},
  7824  		{"NewSource", Func, 0, "func(seed int64) Source"},
  7825  		{"NewZipf", Func, 0, "func(r *Rand, s float64, v float64, imax uint64) *Zipf"},
  7826  		{"NormFloat64", Func, 0, "func() float64"},
  7827  		{"Perm", Func, 0, "func(n int) []int"},
  7828  		{"Rand", Type, 0, ""},
  7829  		{"Read", Func, 6, "func(p []byte) (n int, err error)"},
  7830  		{"Seed", Func, 0, "func(seed int64)"},
  7831  		{"Shuffle", Func, 10, "func(n int, swap func(i int, j int))"},
  7832  		{"Source", Type, 0, ""},
  7833  		{"Source64", Type, 8, ""},
  7834  		{"Uint32", Func, 0, "func() uint32"},
  7835  		{"Uint64", Func, 8, "func() uint64"},
  7836  		{"Zipf", Type, 0, ""},
  7837  	},
  7838  	"math/rand/v2": {
  7839  		{"(*ChaCha8).AppendBinary", Method, 24, ""},
  7840  		{"(*ChaCha8).MarshalBinary", Method, 22, ""},
  7841  		{"(*ChaCha8).Read", Method, 23, ""},
  7842  		{"(*ChaCha8).Seed", Method, 22, ""},
  7843  		{"(*ChaCha8).Uint64", Method, 22, ""},
  7844  		{"(*ChaCha8).UnmarshalBinary", Method, 22, ""},
  7845  		{"(*PCG).AppendBinary", Method, 24, ""},
  7846  		{"(*PCG).MarshalBinary", Method, 22, ""},
  7847  		{"(*PCG).Seed", Method, 22, ""},
  7848  		{"(*PCG).Uint64", Method, 22, ""},
  7849  		{"(*PCG).UnmarshalBinary", Method, 22, ""},
  7850  		{"(*Rand).ExpFloat64", Method, 22, ""},
  7851  		{"(*Rand).Float32", Method, 22, ""},
  7852  		{"(*Rand).Float64", Method, 22, ""},
  7853  		{"(*Rand).Int", Method, 22, ""},
  7854  		{"(*Rand).Int32", Method, 22, ""},
  7855  		{"(*Rand).Int32N", Method, 22, ""},
  7856  		{"(*Rand).Int64", Method, 22, ""},
  7857  		{"(*Rand).Int64N", Method, 22, ""},
  7858  		{"(*Rand).IntN", Method, 22, ""},
  7859  		{"(*Rand).NormFloat64", Method, 22, ""},
  7860  		{"(*Rand).Perm", Method, 22, ""},
  7861  		{"(*Rand).Shuffle", Method, 22, ""},
  7862  		{"(*Rand).Uint", Method, 23, ""},
  7863  		{"(*Rand).Uint32", Method, 22, ""},
  7864  		{"(*Rand).Uint32N", Method, 22, ""},
  7865  		{"(*Rand).Uint64", Method, 22, ""},
  7866  		{"(*Rand).Uint64N", Method, 22, ""},
  7867  		{"(*Rand).UintN", Method, 22, ""},
  7868  		{"(*Zipf).Uint64", Method, 22, ""},
  7869  		{"ChaCha8", Type, 22, ""},
  7870  		{"ExpFloat64", Func, 22, "func() float64"},
  7871  		{"Float32", Func, 22, "func() float32"},
  7872  		{"Float64", Func, 22, "func() float64"},
  7873  		{"Int", Func, 22, "func() int"},
  7874  		{"Int32", Func, 22, "func() int32"},
  7875  		{"Int32N", Func, 22, "func(n int32) int32"},
  7876  		{"Int64", Func, 22, "func() int64"},
  7877  		{"Int64N", Func, 22, "func(n int64) int64"},
  7878  		{"IntN", Func, 22, "func(n int) int"},
  7879  		{"N", Func, 22, "func[Int intType](n Int) Int"},
  7880  		{"New", Func, 22, "func(src Source) *Rand"},
  7881  		{"NewChaCha8", Func, 22, "func(seed [32]byte) *ChaCha8"},
  7882  		{"NewPCG", Func, 22, "func(seed1 uint64, seed2 uint64) *PCG"},
  7883  		{"NewZipf", Func, 22, "func(r *Rand, s float64, v float64, imax uint64) *Zipf"},
  7884  		{"NormFloat64", Func, 22, "func() float64"},
  7885  		{"PCG", Type, 22, ""},
  7886  		{"Perm", Func, 22, "func(n int) []int"},
  7887  		{"Rand", Type, 22, ""},
  7888  		{"Shuffle", Func, 22, "func(n int, swap func(i int, j int))"},
  7889  		{"Source", Type, 22, ""},
  7890  		{"Uint", Func, 23, "func() uint"},
  7891  		{"Uint32", Func, 22, "func() uint32"},
  7892  		{"Uint32N", Func, 22, "func(n uint32) uint32"},
  7893  		{"Uint64", Func, 22, "func() uint64"},
  7894  		{"Uint64N", Func, 22, "func(n uint64) uint64"},
  7895  		{"UintN", Func, 22, "func(n uint) uint"},
  7896  		{"Zipf", Type, 22, ""},
  7897  	},
  7898  	"mime": {
  7899  		{"(*WordDecoder).Decode", Method, 5, ""},
  7900  		{"(*WordDecoder).DecodeHeader", Method, 5, ""},
  7901  		{"(WordEncoder).Encode", Method, 5, ""},
  7902  		{"AddExtensionType", Func, 0, "func(ext string, typ string) error"},
  7903  		{"BEncoding", Const, 5, ""},
  7904  		{"ErrInvalidMediaParameter", Var, 9, ""},
  7905  		{"ExtensionsByType", Func, 5, "func(typ string) ([]string, error)"},
  7906  		{"FormatMediaType", Func, 0, "func(t string, param map[string]string) string"},
  7907  		{"ParseMediaType", Func, 0, "func(v string) (mediatype string, params map[string]string, err error)"},
  7908  		{"QEncoding", Const, 5, ""},
  7909  		{"TypeByExtension", Func, 0, "func(ext string) string"},
  7910  		{"WordDecoder", Type, 5, ""},
  7911  		{"WordDecoder.CharsetReader", Field, 5, ""},
  7912  		{"WordEncoder", Type, 5, ""},
  7913  	},
  7914  	"mime/multipart": {
  7915  		{"(*FileHeader).Open", Method, 0, ""},
  7916  		{"(*Form).RemoveAll", Method, 0, ""},
  7917  		{"(*Part).Close", Method, 0, ""},
  7918  		{"(*Part).FileName", Method, 0, ""},
  7919  		{"(*Part).FormName", Method, 0, ""},
  7920  		{"(*Part).Read", Method, 0, ""},
  7921  		{"(*Reader).NextPart", Method, 0, ""},
  7922  		{"(*Reader).NextRawPart", Method, 14, ""},
  7923  		{"(*Reader).ReadForm", Method, 0, ""},
  7924  		{"(*Writer).Boundary", Method, 0, ""},
  7925  		{"(*Writer).Close", Method, 0, ""},
  7926  		{"(*Writer).CreateFormField", Method, 0, ""},
  7927  		{"(*Writer).CreateFormFile", Method, 0, ""},
  7928  		{"(*Writer).CreatePart", Method, 0, ""},
  7929  		{"(*Writer).FormDataContentType", Method, 0, ""},
  7930  		{"(*Writer).SetBoundary", Method, 1, ""},
  7931  		{"(*Writer).WriteField", Method, 0, ""},
  7932  		{"ErrMessageTooLarge", Var, 9, ""},
  7933  		{"File", Type, 0, ""},
  7934  		{"FileContentDisposition", Func, 25, "func(fieldname string, filename string) string"},
  7935  		{"FileHeader", Type, 0, ""},
  7936  		{"FileHeader.Filename", Field, 0, ""},
  7937  		{"FileHeader.Header", Field, 0, ""},
  7938  		{"FileHeader.Size", Field, 9, ""},
  7939  		{"Form", Type, 0, ""},
  7940  		{"Form.File", Field, 0, ""},
  7941  		{"Form.Value", Field, 0, ""},
  7942  		{"NewReader", Func, 0, "func(r io.Reader, boundary string) *Reader"},
  7943  		{"NewWriter", Func, 0, "func(w io.Writer) *Writer"},
  7944  		{"Part", Type, 0, ""},
  7945  		{"Part.Header", Field, 0, ""},
  7946  		{"Reader", Type, 0, ""},
  7947  		{"Writer", Type, 0, ""},
  7948  	},
  7949  	"mime/quotedprintable": {
  7950  		{"(*Reader).Read", Method, 5, ""},
  7951  		{"(*Writer).Close", Method, 5, ""},
  7952  		{"(*Writer).Write", Method, 5, ""},
  7953  		{"NewReader", Func, 5, "func(r io.Reader) *Reader"},
  7954  		{"NewWriter", Func, 5, "func(w io.Writer) *Writer"},
  7955  		{"Reader", Type, 5, ""},
  7956  		{"Writer", Type, 5, ""},
  7957  		{"Writer.Binary", Field, 5, ""},
  7958  	},
  7959  	"net": {
  7960  		{"(*AddrError).Error", Method, 0, ""},
  7961  		{"(*AddrError).Temporary", Method, 0, ""},
  7962  		{"(*AddrError).Timeout", Method, 0, ""},
  7963  		{"(*Buffers).Read", Method, 8, ""},
  7964  		{"(*Buffers).WriteTo", Method, 8, ""},
  7965  		{"(*DNSConfigError).Error", Method, 0, ""},
  7966  		{"(*DNSConfigError).Temporary", Method, 0, ""},
  7967  		{"(*DNSConfigError).Timeout", Method, 0, ""},
  7968  		{"(*DNSConfigError).Unwrap", Method, 13, ""},
  7969  		{"(*DNSError).Error", Method, 0, ""},
  7970  		{"(*DNSError).Temporary", Method, 0, ""},
  7971  		{"(*DNSError).Timeout", Method, 0, ""},
  7972  		{"(*DNSError).Unwrap", Method, 23, ""},
  7973  		{"(*Dialer).Dial", Method, 1, ""},
  7974  		{"(*Dialer).DialContext", Method, 7, ""},
  7975  		{"(*Dialer).MultipathTCP", Method, 21, ""},
  7976  		{"(*Dialer).SetMultipathTCP", Method, 21, ""},
  7977  		{"(*IP).UnmarshalText", Method, 2, ""},
  7978  		{"(*IPAddr).Network", Method, 0, ""},
  7979  		{"(*IPAddr).String", Method, 0, ""},
  7980  		{"(*IPConn).Close", Method, 0, ""},
  7981  		{"(*IPConn).File", Method, 0, ""},
  7982  		{"(*IPConn).LocalAddr", Method, 0, ""},
  7983  		{"(*IPConn).Read", Method, 0, ""},
  7984  		{"(*IPConn).ReadFrom", Method, 0, ""},
  7985  		{"(*IPConn).ReadFromIP", Method, 0, ""},
  7986  		{"(*IPConn).ReadMsgIP", Method, 1, ""},
  7987  		{"(*IPConn).RemoteAddr", Method, 0, ""},
  7988  		{"(*IPConn).SetDeadline", Method, 0, ""},
  7989  		{"(*IPConn).SetReadBuffer", Method, 0, ""},
  7990  		{"(*IPConn).SetReadDeadline", Method, 0, ""},
  7991  		{"(*IPConn).SetWriteBuffer", Method, 0, ""},
  7992  		{"(*IPConn).SetWriteDeadline", Method, 0, ""},
  7993  		{"(*IPConn).SyscallConn", Method, 9, ""},
  7994  		{"(*IPConn).Write", Method, 0, ""},
  7995  		{"(*IPConn).WriteMsgIP", Method, 1, ""},
  7996  		{"(*IPConn).WriteTo", Method, 0, ""},
  7997  		{"(*IPConn).WriteToIP", Method, 0, ""},
  7998  		{"(*IPNet).Contains", Method, 0, ""},
  7999  		{"(*IPNet).Network", Method, 0, ""},
  8000  		{"(*IPNet).String", Method, 0, ""},
  8001  		{"(*Interface).Addrs", Method, 0, ""},
  8002  		{"(*Interface).MulticastAddrs", Method, 0, ""},
  8003  		{"(*ListenConfig).Listen", Method, 11, ""},
  8004  		{"(*ListenConfig).ListenPacket", Method, 11, ""},
  8005  		{"(*ListenConfig).MultipathTCP", Method, 21, ""},
  8006  		{"(*ListenConfig).SetMultipathTCP", Method, 21, ""},
  8007  		{"(*OpError).Error", Method, 0, ""},
  8008  		{"(*OpError).Temporary", Method, 0, ""},
  8009  		{"(*OpError).Timeout", Method, 0, ""},
  8010  		{"(*OpError).Unwrap", Method, 13, ""},
  8011  		{"(*ParseError).Error", Method, 0, ""},
  8012  		{"(*ParseError).Temporary", Method, 17, ""},
  8013  		{"(*ParseError).Timeout", Method, 17, ""},
  8014  		{"(*Resolver).LookupAddr", Method, 8, ""},
  8015  		{"(*Resolver).LookupCNAME", Method, 8, ""},
  8016  		{"(*Resolver).LookupHost", Method, 8, ""},
  8017  		{"(*Resolver).LookupIP", Method, 15, ""},
  8018  		{"(*Resolver).LookupIPAddr", Method, 8, ""},
  8019  		{"(*Resolver).LookupMX", Method, 8, ""},
  8020  		{"(*Resolver).LookupNS", Method, 8, ""},
  8021  		{"(*Resolver).LookupNetIP", Method, 18, ""},
  8022  		{"(*Resolver).LookupPort", Method, 8, ""},
  8023  		{"(*Resolver).LookupSRV", Method, 8, ""},
  8024  		{"(*Resolver).LookupTXT", Method, 8, ""},
  8025  		{"(*TCPAddr).AddrPort", Method, 18, ""},
  8026  		{"(*TCPAddr).Network", Method, 0, ""},
  8027  		{"(*TCPAddr).String", Method, 0, ""},
  8028  		{"(*TCPConn).Close", Method, 0, ""},
  8029  		{"(*TCPConn).CloseRead", Method, 0, ""},
  8030  		{"(*TCPConn).CloseWrite", Method, 0, ""},
  8031  		{"(*TCPConn).File", Method, 0, ""},
  8032  		{"(*TCPConn).LocalAddr", Method, 0, ""},
  8033  		{"(*TCPConn).MultipathTCP", Method, 21, ""},
  8034  		{"(*TCPConn).Read", Method, 0, ""},
  8035  		{"(*TCPConn).ReadFrom", Method, 0, ""},
  8036  		{"(*TCPConn).RemoteAddr", Method, 0, ""},
  8037  		{"(*TCPConn).SetDeadline", Method, 0, ""},
  8038  		{"(*TCPConn).SetKeepAlive", Method, 0, ""},
  8039  		{"(*TCPConn).SetKeepAliveConfig", Method, 23, ""},
  8040  		{"(*TCPConn).SetKeepAlivePeriod", Method, 2, ""},
  8041  		{"(*TCPConn).SetLinger", Method, 0, ""},
  8042  		{"(*TCPConn).SetNoDelay", Method, 0, ""},
  8043  		{"(*TCPConn).SetReadBuffer", Method, 0, ""},
  8044  		{"(*TCPConn).SetReadDeadline", Method, 0, ""},
  8045  		{"(*TCPConn).SetWriteBuffer", Method, 0, ""},
  8046  		{"(*TCPConn).SetWriteDeadline", Method, 0, ""},
  8047  		{"(*TCPConn).SyscallConn", Method, 9, ""},
  8048  		{"(*TCPConn).Write", Method, 0, ""},
  8049  		{"(*TCPConn).WriteTo", Method, 22, ""},
  8050  		{"(*TCPListener).Accept", Method, 0, ""},
  8051  		{"(*TCPListener).AcceptTCP", Method, 0, ""},
  8052  		{"(*TCPListener).Addr", Method, 0, ""},
  8053  		{"(*TCPListener).Close", Method, 0, ""},
  8054  		{"(*TCPListener).File", Method, 0, ""},
  8055  		{"(*TCPListener).SetDeadline", Method, 0, ""},
  8056  		{"(*TCPListener).SyscallConn", Method, 10, ""},
  8057  		{"(*UDPAddr).AddrPort", Method, 18, ""},
  8058  		{"(*UDPAddr).Network", Method, 0, ""},
  8059  		{"(*UDPAddr).String", Method, 0, ""},
  8060  		{"(*UDPConn).Close", Method, 0, ""},
  8061  		{"(*UDPConn).File", Method, 0, ""},
  8062  		{"(*UDPConn).LocalAddr", Method, 0, ""},
  8063  		{"(*UDPConn).Read", Method, 0, ""},
  8064  		{"(*UDPConn).ReadFrom", Method, 0, ""},
  8065  		{"(*UDPConn).ReadFromUDP", Method, 0, ""},
  8066  		{"(*UDPConn).ReadFromUDPAddrPort", Method, 18, ""},
  8067  		{"(*UDPConn).ReadMsgUDP", Method, 1, ""},
  8068  		{"(*UDPConn).ReadMsgUDPAddrPort", Method, 18, ""},
  8069  		{"(*UDPConn).RemoteAddr", Method, 0, ""},
  8070  		{"(*UDPConn).SetDeadline", Method, 0, ""},
  8071  		{"(*UDPConn).SetReadBuffer", Method, 0, ""},
  8072  		{"(*UDPConn).SetReadDeadline", Method, 0, ""},
  8073  		{"(*UDPConn).SetWriteBuffer", Method, 0, ""},
  8074  		{"(*UDPConn).SetWriteDeadline", Method, 0, ""},
  8075  		{"(*UDPConn).SyscallConn", Method, 9, ""},
  8076  		{"(*UDPConn).Write", Method, 0, ""},
  8077  		{"(*UDPConn).WriteMsgUDP", Method, 1, ""},
  8078  		{"(*UDPConn).WriteMsgUDPAddrPort", Method, 18, ""},
  8079  		{"(*UDPConn).WriteTo", Method, 0, ""},
  8080  		{"(*UDPConn).WriteToUDP", Method, 0, ""},
  8081  		{"(*UDPConn).WriteToUDPAddrPort", Method, 18, ""},
  8082  		{"(*UnixAddr).Network", Method, 0, ""},
  8083  		{"(*UnixAddr).String", Method, 0, ""},
  8084  		{"(*UnixConn).Close", Method, 0, ""},
  8085  		{"(*UnixConn).CloseRead", Method, 1, ""},
  8086  		{"(*UnixConn).CloseWrite", Method, 1, ""},
  8087  		{"(*UnixConn).File", Method, 0, ""},
  8088  		{"(*UnixConn).LocalAddr", Method, 0, ""},
  8089  		{"(*UnixConn).Read", Method, 0, ""},
  8090  		{"(*UnixConn).ReadFrom", Method, 0, ""},
  8091  		{"(*UnixConn).ReadFromUnix", Method, 0, ""},
  8092  		{"(*UnixConn).ReadMsgUnix", Method, 0, ""},
  8093  		{"(*UnixConn).RemoteAddr", Method, 0, ""},
  8094  		{"(*UnixConn).SetDeadline", Method, 0, ""},
  8095  		{"(*UnixConn).SetReadBuffer", Method, 0, ""},
  8096  		{"(*UnixConn).SetReadDeadline", Method, 0, ""},
  8097  		{"(*UnixConn).SetWriteBuffer", Method, 0, ""},
  8098  		{"(*UnixConn).SetWriteDeadline", Method, 0, ""},
  8099  		{"(*UnixConn).SyscallConn", Method, 9, ""},
  8100  		{"(*UnixConn).Write", Method, 0, ""},
  8101  		{"(*UnixConn).WriteMsgUnix", Method, 0, ""},
  8102  		{"(*UnixConn).WriteTo", Method, 0, ""},
  8103  		{"(*UnixConn).WriteToUnix", Method, 0, ""},
  8104  		{"(*UnixListener).Accept", Method, 0, ""},
  8105  		{"(*UnixListener).AcceptUnix", Method, 0, ""},
  8106  		{"(*UnixListener).Addr", Method, 0, ""},
  8107  		{"(*UnixListener).Close", Method, 0, ""},
  8108  		{"(*UnixListener).File", Method, 0, ""},
  8109  		{"(*UnixListener).SetDeadline", Method, 0, ""},
  8110  		{"(*UnixListener).SetUnlinkOnClose", Method, 8, ""},
  8111  		{"(*UnixListener).SyscallConn", Method, 10, ""},
  8112  		{"(Flags).String", Method, 0, ""},
  8113  		{"(HardwareAddr).String", Method, 0, ""},
  8114  		{"(IP).AppendText", Method, 24, ""},
  8115  		{"(IP).DefaultMask", Method, 0, ""},
  8116  		{"(IP).Equal", Method, 0, ""},
  8117  		{"(IP).IsGlobalUnicast", Method, 0, ""},
  8118  		{"(IP).IsInterfaceLocalMulticast", Method, 0, ""},
  8119  		{"(IP).IsLinkLocalMulticast", Method, 0, ""},
  8120  		{"(IP).IsLinkLocalUnicast", Method, 0, ""},
  8121  		{"(IP).IsLoopback", Method, 0, ""},
  8122  		{"(IP).IsMulticast", Method, 0, ""},
  8123  		{"(IP).IsPrivate", Method, 17, ""},
  8124  		{"(IP).IsUnspecified", Method, 0, ""},
  8125  		{"(IP).MarshalText", Method, 2, ""},
  8126  		{"(IP).Mask", Method, 0, ""},
  8127  		{"(IP).String", Method, 0, ""},
  8128  		{"(IP).To16", Method, 0, ""},
  8129  		{"(IP).To4", Method, 0, ""},
  8130  		{"(IPMask).Size", Method, 0, ""},
  8131  		{"(IPMask).String", Method, 0, ""},
  8132  		{"(InvalidAddrError).Error", Method, 0, ""},
  8133  		{"(InvalidAddrError).Temporary", Method, 0, ""},
  8134  		{"(InvalidAddrError).Timeout", Method, 0, ""},
  8135  		{"(UnknownNetworkError).Error", Method, 0, ""},
  8136  		{"(UnknownNetworkError).Temporary", Method, 0, ""},
  8137  		{"(UnknownNetworkError).Timeout", Method, 0, ""},
  8138  		{"Addr", Type, 0, ""},
  8139  		{"AddrError", Type, 0, ""},
  8140  		{"AddrError.Addr", Field, 0, ""},
  8141  		{"AddrError.Err", Field, 0, ""},
  8142  		{"Buffers", Type, 8, ""},
  8143  		{"CIDRMask", Func, 0, "func(ones int, bits int) IPMask"},
  8144  		{"Conn", Type, 0, ""},
  8145  		{"DNSConfigError", Type, 0, ""},
  8146  		{"DNSConfigError.Err", Field, 0, ""},
  8147  		{"DNSError", Type, 0, ""},
  8148  		{"DNSError.Err", Field, 0, ""},
  8149  		{"DNSError.IsNotFound", Field, 13, ""},
  8150  		{"DNSError.IsTemporary", Field, 6, ""},
  8151  		{"DNSError.IsTimeout", Field, 0, ""},
  8152  		{"DNSError.Name", Field, 0, ""},
  8153  		{"DNSError.Server", Field, 0, ""},
  8154  		{"DNSError.UnwrapErr", Field, 23, ""},
  8155  		{"DefaultResolver", Var, 8, ""},
  8156  		{"Dial", Func, 0, "func(network string, address string) (Conn, error)"},
  8157  		{"DialIP", Func, 0, "func(network string, laddr *IPAddr, raddr *IPAddr) (*IPConn, error)"},
  8158  		{"DialTCP", Func, 0, "func(network string, laddr *TCPAddr, raddr *TCPAddr) (*TCPConn, error)"},
  8159  		{"DialTimeout", Func, 0, "func(network string, address string, timeout time.Duration) (Conn, error)"},
  8160  		{"DialUDP", Func, 0, "func(network string, laddr *UDPAddr, raddr *UDPAddr) (*UDPConn, error)"},
  8161  		{"DialUnix", Func, 0, "func(network string, laddr *UnixAddr, raddr *UnixAddr) (*UnixConn, error)"},
  8162  		{"Dialer", Type, 1, ""},
  8163  		{"Dialer.Cancel", Field, 6, ""},
  8164  		{"Dialer.Control", Field, 11, ""},
  8165  		{"Dialer.ControlContext", Field, 20, ""},
  8166  		{"Dialer.Deadline", Field, 1, ""},
  8167  		{"Dialer.DualStack", Field, 2, ""},
  8168  		{"Dialer.FallbackDelay", Field, 5, ""},
  8169  		{"Dialer.KeepAlive", Field, 3, ""},
  8170  		{"Dialer.KeepAliveConfig", Field, 23, ""},
  8171  		{"Dialer.LocalAddr", Field, 1, ""},
  8172  		{"Dialer.Resolver", Field, 8, ""},
  8173  		{"Dialer.Timeout", Field, 1, ""},
  8174  		{"ErrClosed", Var, 16, ""},
  8175  		{"ErrWriteToConnected", Var, 0, ""},
  8176  		{"Error", Type, 0, ""},
  8177  		{"FileConn", Func, 0, "func(f *os.File) (c Conn, err error)"},
  8178  		{"FileListener", Func, 0, "func(f *os.File) (ln Listener, err error)"},
  8179  		{"FilePacketConn", Func, 0, "func(f *os.File) (c PacketConn, err error)"},
  8180  		{"FlagBroadcast", Const, 0, ""},
  8181  		{"FlagLoopback", Const, 0, ""},
  8182  		{"FlagMulticast", Const, 0, ""},
  8183  		{"FlagPointToPoint", Const, 0, ""},
  8184  		{"FlagRunning", Const, 20, ""},
  8185  		{"FlagUp", Const, 0, ""},
  8186  		{"Flags", Type, 0, ""},
  8187  		{"HardwareAddr", Type, 0, ""},
  8188  		{"IP", Type, 0, ""},
  8189  		{"IPAddr", Type, 0, ""},
  8190  		{"IPAddr.IP", Field, 0, ""},
  8191  		{"IPAddr.Zone", Field, 1, ""},
  8192  		{"IPConn", Type, 0, ""},
  8193  		{"IPMask", Type, 0, ""},
  8194  		{"IPNet", Type, 0, ""},
  8195  		{"IPNet.IP", Field, 0, ""},
  8196  		{"IPNet.Mask", Field, 0, ""},
  8197  		{"IPv4", Func, 0, "func(a byte, b byte, c byte, d byte) IP"},
  8198  		{"IPv4Mask", Func, 0, "func(a byte, b byte, c byte, d byte) IPMask"},
  8199  		{"IPv4allrouter", Var, 0, ""},
  8200  		{"IPv4allsys", Var, 0, ""},
  8201  		{"IPv4bcast", Var, 0, ""},
  8202  		{"IPv4len", Const, 0, ""},
  8203  		{"IPv4zero", Var, 0, ""},
  8204  		{"IPv6interfacelocalallnodes", Var, 0, ""},
  8205  		{"IPv6len", Const, 0, ""},
  8206  		{"IPv6linklocalallnodes", Var, 0, ""},
  8207  		{"IPv6linklocalallrouters", Var, 0, ""},
  8208  		{"IPv6loopback", Var, 0, ""},
  8209  		{"IPv6unspecified", Var, 0, ""},
  8210  		{"IPv6zero", Var, 0, ""},
  8211  		{"Interface", Type, 0, ""},
  8212  		{"Interface.Flags", Field, 0, ""},
  8213  		{"Interface.HardwareAddr", Field, 0, ""},
  8214  		{"Interface.Index", Field, 0, ""},
  8215  		{"Interface.MTU", Field, 0, ""},
  8216  		{"Interface.Name", Field, 0, ""},
  8217  		{"InterfaceAddrs", Func, 0, "func() ([]Addr, error)"},
  8218  		{"InterfaceByIndex", Func, 0, "func(index int) (*Interface, error)"},
  8219  		{"InterfaceByName", Func, 0, "func(name string) (*Interface, error)"},
  8220  		{"Interfaces", Func, 0, "func() ([]Interface, error)"},
  8221  		{"InvalidAddrError", Type, 0, ""},
  8222  		{"JoinHostPort", Func, 0, "func(host string, port string) string"},
  8223  		{"KeepAliveConfig", Type, 23, ""},
  8224  		{"KeepAliveConfig.Count", Field, 23, ""},
  8225  		{"KeepAliveConfig.Enable", Field, 23, ""},
  8226  		{"KeepAliveConfig.Idle", Field, 23, ""},
  8227  		{"KeepAliveConfig.Interval", Field, 23, ""},
  8228  		{"Listen", Func, 0, "func(network string, address string) (Listener, error)"},
  8229  		{"ListenConfig", Type, 11, ""},
  8230  		{"ListenConfig.Control", Field, 11, ""},
  8231  		{"ListenConfig.KeepAlive", Field, 13, ""},
  8232  		{"ListenConfig.KeepAliveConfig", Field, 23, ""},
  8233  		{"ListenIP", Func, 0, "func(network string, laddr *IPAddr) (*IPConn, error)"},
  8234  		{"ListenMulticastUDP", Func, 0, "func(network string, ifi *Interface, gaddr *UDPAddr) (*UDPConn, error)"},
  8235  		{"ListenPacket", Func, 0, "func(network string, address string) (PacketConn, error)"},
  8236  		{"ListenTCP", Func, 0, "func(network string, laddr *TCPAddr) (*TCPListener, error)"},
  8237  		{"ListenUDP", Func, 0, "func(network string, laddr *UDPAddr) (*UDPConn, error)"},
  8238  		{"ListenUnix", Func, 0, "func(network string, laddr *UnixAddr) (*UnixListener, error)"},
  8239  		{"ListenUnixgram", Func, 0, "func(network string, laddr *UnixAddr) (*UnixConn, error)"},
  8240  		{"Listener", Type, 0, ""},
  8241  		{"LookupAddr", Func, 0, "func(addr string) (names []string, err error)"},
  8242  		{"LookupCNAME", Func, 0, "func(host string) (cname string, err error)"},
  8243  		{"LookupHost", Func, 0, "func(host string) (addrs []string, err error)"},
  8244  		{"LookupIP", Func, 0, "func(host string) ([]IP, error)"},
  8245  		{"LookupMX", Func, 0, "func(name string) ([]*MX, error)"},
  8246  		{"LookupNS", Func, 1, "func(name string) ([]*NS, error)"},
  8247  		{"LookupPort", Func, 0, "func(network string, service string) (port int, err error)"},
  8248  		{"LookupSRV", Func, 0, "func(service string, proto string, name string) (cname string, addrs []*SRV, err error)"},
  8249  		{"LookupTXT", Func, 0, "func(name string) ([]string, error)"},
  8250  		{"MX", Type, 0, ""},
  8251  		{"MX.Host", Field, 0, ""},
  8252  		{"MX.Pref", Field, 0, ""},
  8253  		{"NS", Type, 1, ""},
  8254  		{"NS.Host", Field, 1, ""},
  8255  		{"OpError", Type, 0, ""},
  8256  		{"OpError.Addr", Field, 0, ""},
  8257  		{"OpError.Err", Field, 0, ""},
  8258  		{"OpError.Net", Field, 0, ""},
  8259  		{"OpError.Op", Field, 0, ""},
  8260  		{"OpError.Source", Field, 5, ""},
  8261  		{"PacketConn", Type, 0, ""},
  8262  		{"ParseCIDR", Func, 0, "func(s string) (IP, *IPNet, error)"},
  8263  		{"ParseError", Type, 0, ""},
  8264  		{"ParseError.Text", Field, 0, ""},
  8265  		{"ParseError.Type", Field, 0, ""},
  8266  		{"ParseIP", Func, 0, "func(s string) IP"},
  8267  		{"ParseMAC", Func, 0, "func(s string) (hw HardwareAddr, err error)"},
  8268  		{"Pipe", Func, 0, "func() (Conn, Conn)"},
  8269  		{"ResolveIPAddr", Func, 0, "func(network string, address string) (*IPAddr, error)"},
  8270  		{"ResolveTCPAddr", Func, 0, "func(network string, address string) (*TCPAddr, error)"},
  8271  		{"ResolveUDPAddr", Func, 0, "func(network string, address string) (*UDPAddr, error)"},
  8272  		{"ResolveUnixAddr", Func, 0, "func(network string, address string) (*UnixAddr, error)"},
  8273  		{"Resolver", Type, 8, ""},
  8274  		{"Resolver.Dial", Field, 9, ""},
  8275  		{"Resolver.PreferGo", Field, 8, ""},
  8276  		{"Resolver.StrictErrors", Field, 9, ""},
  8277  		{"SRV", Type, 0, ""},
  8278  		{"SRV.Port", Field, 0, ""},
  8279  		{"SRV.Priority", Field, 0, ""},
  8280  		{"SRV.Target", Field, 0, ""},
  8281  		{"SRV.Weight", Field, 0, ""},
  8282  		{"SplitHostPort", Func, 0, "func(hostport string) (host string, port string, err error)"},
  8283  		{"TCPAddr", Type, 0, ""},
  8284  		{"TCPAddr.IP", Field, 0, ""},
  8285  		{"TCPAddr.Port", Field, 0, ""},
  8286  		{"TCPAddr.Zone", Field, 1, ""},
  8287  		{"TCPAddrFromAddrPort", Func, 18, "func(addr netip.AddrPort) *TCPAddr"},
  8288  		{"TCPConn", Type, 0, ""},
  8289  		{"TCPListener", Type, 0, ""},
  8290  		{"UDPAddr", Type, 0, ""},
  8291  		{"UDPAddr.IP", Field, 0, ""},
  8292  		{"UDPAddr.Port", Field, 0, ""},
  8293  		{"UDPAddr.Zone", Field, 1, ""},
  8294  		{"UDPAddrFromAddrPort", Func, 18, "func(addr netip.AddrPort) *UDPAddr"},
  8295  		{"UDPConn", Type, 0, ""},
  8296  		{"UnixAddr", Type, 0, ""},
  8297  		{"UnixAddr.Name", Field, 0, ""},
  8298  		{"UnixAddr.Net", Field, 0, ""},
  8299  		{"UnixConn", Type, 0, ""},
  8300  		{"UnixListener", Type, 0, ""},
  8301  		{"UnknownNetworkError", Type, 0, ""},
  8302  	},
  8303  	"net/http": {
  8304  		{"(*Client).CloseIdleConnections", Method, 12, ""},
  8305  		{"(*Client).Do", Method, 0, ""},
  8306  		{"(*Client).Get", Method, 0, ""},
  8307  		{"(*Client).Head", Method, 0, ""},
  8308  		{"(*Client).Post", Method, 0, ""},
  8309  		{"(*Client).PostForm", Method, 0, ""},
  8310  		{"(*Cookie).String", Method, 0, ""},
  8311  		{"(*Cookie).Valid", Method, 18, ""},
  8312  		{"(*CrossOriginProtection).AddInsecureBypassPattern", Method, 25, ""},
  8313  		{"(*CrossOriginProtection).AddTrustedOrigin", Method, 25, ""},
  8314  		{"(*CrossOriginProtection).Check", Method, 25, ""},
  8315  		{"(*CrossOriginProtection).Handler", Method, 25, ""},
  8316  		{"(*CrossOriginProtection).SetDenyHandler", Method, 25, ""},
  8317  		{"(*MaxBytesError).Error", Method, 19, ""},
  8318  		{"(*ProtocolError).Error", Method, 0, ""},
  8319  		{"(*ProtocolError).Is", Method, 21, ""},
  8320  		{"(*Protocols).SetHTTP1", Method, 24, ""},
  8321  		{"(*Protocols).SetHTTP2", Method, 24, ""},
  8322  		{"(*Protocols).SetUnencryptedHTTP2", Method, 24, ""},
  8323  		{"(*Request).AddCookie", Method, 0, ""},
  8324  		{"(*Request).BasicAuth", Method, 4, ""},
  8325  		{"(*Request).Clone", Method, 13, ""},
  8326  		{"(*Request).Context", Method, 7, ""},
  8327  		{"(*Request).Cookie", Method, 0, ""},
  8328  		{"(*Request).Cookies", Method, 0, ""},
  8329  		{"(*Request).CookiesNamed", Method, 23, ""},
  8330  		{"(*Request).FormFile", Method, 0, ""},
  8331  		{"(*Request).FormValue", Method, 0, ""},
  8332  		{"(*Request).MultipartReader", Method, 0, ""},
  8333  		{"(*Request).ParseForm", Method, 0, ""},
  8334  		{"(*Request).ParseMultipartForm", Method, 0, ""},
  8335  		{"(*Request).PathValue", Method, 22, ""},
  8336  		{"(*Request).PostFormValue", Method, 1, ""},
  8337  		{"(*Request).ProtoAtLeast", Method, 0, ""},
  8338  		{"(*Request).Referer", Method, 0, ""},
  8339  		{"(*Request).SetBasicAuth", Method, 0, ""},
  8340  		{"(*Request).SetPathValue", Method, 22, ""},
  8341  		{"(*Request).UserAgent", Method, 0, ""},
  8342  		{"(*Request).WithContext", Method, 7, ""},
  8343  		{"(*Request).Write", Method, 0, ""},
  8344  		{"(*Request).WriteProxy", Method, 0, ""},
  8345  		{"(*Response).Cookies", Method, 0, ""},
  8346  		{"(*Response).Location", Method, 0, ""},
  8347  		{"(*Response).ProtoAtLeast", Method, 0, ""},
  8348  		{"(*Response).Write", Method, 0, ""},
  8349  		{"(*ResponseController).EnableFullDuplex", Method, 21, ""},
  8350  		{"(*ResponseController).Flush", Method, 20, ""},
  8351  		{"(*ResponseController).Hijack", Method, 20, ""},
  8352  		{"(*ResponseController).SetReadDeadline", Method, 20, ""},
  8353  		{"(*ResponseController).SetWriteDeadline", Method, 20, ""},
  8354  		{"(*ServeMux).Handle", Method, 0, ""},
  8355  		{"(*ServeMux).HandleFunc", Method, 0, ""},
  8356  		{"(*ServeMux).Handler", Method, 1, ""},
  8357  		{"(*ServeMux).ServeHTTP", Method, 0, ""},
  8358  		{"(*Server).Close", Method, 8, ""},
  8359  		{"(*Server).ListenAndServe", Method, 0, ""},
  8360  		{"(*Server).ListenAndServeTLS", Method, 0, ""},
  8361  		{"(*Server).RegisterOnShutdown", Method, 9, ""},
  8362  		{"(*Server).Serve", Method, 0, ""},
  8363  		{"(*Server).ServeTLS", Method, 9, ""},
  8364  		{"(*Server).SetKeepAlivesEnabled", Method, 3, ""},
  8365  		{"(*Server).Shutdown", Method, 8, ""},
  8366  		{"(*Transport).CancelRequest", Method, 1, ""},
  8367  		{"(*Transport).Clone", Method, 13, ""},
  8368  		{"(*Transport).CloseIdleConnections", Method, 0, ""},
  8369  		{"(*Transport).RegisterProtocol", Method, 0, ""},
  8370  		{"(*Transport).RoundTrip", Method, 0, ""},
  8371  		{"(ConnState).String", Method, 3, ""},
  8372  		{"(Dir).Open", Method, 0, ""},
  8373  		{"(HandlerFunc).ServeHTTP", Method, 0, ""},
  8374  		{"(Header).Add", Method, 0, ""},
  8375  		{"(Header).Clone", Method, 13, ""},
  8376  		{"(Header).Del", Method, 0, ""},
  8377  		{"(Header).Get", Method, 0, ""},
  8378  		{"(Header).Set", Method, 0, ""},
  8379  		{"(Header).Values", Method, 14, ""},
  8380  		{"(Header).Write", Method, 0, ""},
  8381  		{"(Header).WriteSubset", Method, 0, ""},
  8382  		{"(Protocols).HTTP1", Method, 24, ""},
  8383  		{"(Protocols).HTTP2", Method, 24, ""},
  8384  		{"(Protocols).String", Method, 24, ""},
  8385  		{"(Protocols).UnencryptedHTTP2", Method, 24, ""},
  8386  		{"AllowQuerySemicolons", Func, 17, "func(h Handler) Handler"},
  8387  		{"CanonicalHeaderKey", Func, 0, "func(s string) string"},
  8388  		{"Client", Type, 0, ""},
  8389  		{"Client.CheckRedirect", Field, 0, ""},
  8390  		{"Client.Jar", Field, 0, ""},
  8391  		{"Client.Timeout", Field, 3, ""},
  8392  		{"Client.Transport", Field, 0, ""},
  8393  		{"CloseNotifier", Type, 1, ""},
  8394  		{"ConnState", Type, 3, ""},
  8395  		{"Cookie", Type, 0, ""},
  8396  		{"Cookie.Domain", Field, 0, ""},
  8397  		{"Cookie.Expires", Field, 0, ""},
  8398  		{"Cookie.HttpOnly", Field, 0, ""},
  8399  		{"Cookie.MaxAge", Field, 0, ""},
  8400  		{"Cookie.Name", Field, 0, ""},
  8401  		{"Cookie.Partitioned", Field, 23, ""},
  8402  		{"Cookie.Path", Field, 0, ""},
  8403  		{"Cookie.Quoted", Field, 23, ""},
  8404  		{"Cookie.Raw", Field, 0, ""},
  8405  		{"Cookie.RawExpires", Field, 0, ""},
  8406  		{"Cookie.SameSite", Field, 11, ""},
  8407  		{"Cookie.Secure", Field, 0, ""},
  8408  		{"Cookie.Unparsed", Field, 0, ""},
  8409  		{"Cookie.Value", Field, 0, ""},
  8410  		{"CookieJar", Type, 0, ""},
  8411  		{"CrossOriginProtection", Type, 25, ""},
  8412  		{"DefaultClient", Var, 0, ""},
  8413  		{"DefaultMaxHeaderBytes", Const, 0, ""},
  8414  		{"DefaultMaxIdleConnsPerHost", Const, 0, ""},
  8415  		{"DefaultServeMux", Var, 0, ""},
  8416  		{"DefaultTransport", Var, 0, ""},
  8417  		{"DetectContentType", Func, 0, "func(data []byte) string"},
  8418  		{"Dir", Type, 0, ""},
  8419  		{"ErrAbortHandler", Var, 8, ""},
  8420  		{"ErrBodyNotAllowed", Var, 0, ""},
  8421  		{"ErrBodyReadAfterClose", Var, 0, ""},
  8422  		{"ErrContentLength", Var, 0, ""},
  8423  		{"ErrHandlerTimeout", Var, 0, ""},
  8424  		{"ErrHeaderTooLong", Var, 0, ""},
  8425  		{"ErrHijacked", Var, 0, ""},
  8426  		{"ErrLineTooLong", Var, 0, ""},
  8427  		{"ErrMissingBoundary", Var, 0, ""},
  8428  		{"ErrMissingContentLength", Var, 0, ""},
  8429  		{"ErrMissingFile", Var, 0, ""},
  8430  		{"ErrNoCookie", Var, 0, ""},
  8431  		{"ErrNoLocation", Var, 0, ""},
  8432  		{"ErrNotMultipart", Var, 0, ""},
  8433  		{"ErrNotSupported", Var, 0, ""},
  8434  		{"ErrSchemeMismatch", Var, 21, ""},
  8435  		{"ErrServerClosed", Var, 8, ""},
  8436  		{"ErrShortBody", Var, 0, ""},
  8437  		{"ErrSkipAltProtocol", Var, 6, ""},
  8438  		{"ErrUnexpectedTrailer", Var, 0, ""},
  8439  		{"ErrUseLastResponse", Var, 7, ""},
  8440  		{"ErrWriteAfterFlush", Var, 0, ""},
  8441  		{"Error", Func, 0, "func(w ResponseWriter, error string, code int)"},
  8442  		{"FS", Func, 16, "func(fsys fs.FS) FileSystem"},
  8443  		{"File", Type, 0, ""},
  8444  		{"FileServer", Func, 0, "func(root FileSystem) Handler"},
  8445  		{"FileServerFS", Func, 22, "func(root fs.FS) Handler"},
  8446  		{"FileSystem", Type, 0, ""},
  8447  		{"Flusher", Type, 0, ""},
  8448  		{"Get", Func, 0, "func(url string) (resp *Response, err error)"},
  8449  		{"HTTP2Config", Type, 24, ""},
  8450  		{"HTTP2Config.CountError", Field, 24, ""},
  8451  		{"HTTP2Config.MaxConcurrentStreams", Field, 24, ""},
  8452  		{"HTTP2Config.MaxDecoderHeaderTableSize", Field, 24, ""},
  8453  		{"HTTP2Config.MaxEncoderHeaderTableSize", Field, 24, ""},
  8454  		{"HTTP2Config.MaxReadFrameSize", Field, 24, ""},
  8455  		{"HTTP2Config.MaxReceiveBufferPerConnection", Field, 24, ""},
  8456  		{"HTTP2Config.MaxReceiveBufferPerStream", Field, 24, ""},
  8457  		{"HTTP2Config.PermitProhibitedCipherSuites", Field, 24, ""},
  8458  		{"HTTP2Config.PingTimeout", Field, 24, ""},
  8459  		{"HTTP2Config.SendPingTimeout", Field, 24, ""},
  8460  		{"HTTP2Config.WriteByteTimeout", Field, 24, ""},
  8461  		{"Handle", Func, 0, "func(pattern string, handler Handler)"},
  8462  		{"HandleFunc", Func, 0, "func(pattern string, handler func(ResponseWriter, *Request))"},
  8463  		{"Handler", Type, 0, ""},
  8464  		{"HandlerFunc", Type, 0, ""},
  8465  		{"Head", Func, 0, "func(url string) (resp *Response, err error)"},
  8466  		{"Header", Type, 0, ""},
  8467  		{"Hijacker", Type, 0, ""},
  8468  		{"ListenAndServe", Func, 0, "func(addr string, handler Handler) error"},
  8469  		{"ListenAndServeTLS", Func, 0, "func(addr string, certFile string, keyFile string, handler Handler) error"},
  8470  		{"LocalAddrContextKey", Var, 7, ""},
  8471  		{"MaxBytesError", Type, 19, ""},
  8472  		{"MaxBytesError.Limit", Field, 19, ""},
  8473  		{"MaxBytesHandler", Func, 18, "func(h Handler, n int64) Handler"},
  8474  		{"MaxBytesReader", Func, 0, "func(w ResponseWriter, r io.ReadCloser, n int64) io.ReadCloser"},
  8475  		{"MethodConnect", Const, 6, ""},
  8476  		{"MethodDelete", Const, 6, ""},
  8477  		{"MethodGet", Const, 6, ""},
  8478  		{"MethodHead", Const, 6, ""},
  8479  		{"MethodOptions", Const, 6, ""},
  8480  		{"MethodPatch", Const, 6, ""},
  8481  		{"MethodPost", Const, 6, ""},
  8482  		{"MethodPut", Const, 6, ""},
  8483  		{"MethodTrace", Const, 6, ""},
  8484  		{"NewCrossOriginProtection", Func, 25, "func() *CrossOriginProtection"},
  8485  		{"NewFileTransport", Func, 0, "func(fs FileSystem) RoundTripper"},
  8486  		{"NewFileTransportFS", Func, 22, "func(fsys fs.FS) RoundTripper"},
  8487  		{"NewRequest", Func, 0, "func(method string, url string, body io.Reader) (*Request, error)"},
  8488  		{"NewRequestWithContext", Func, 13, "func(ctx context.Context, method string, url string, body io.Reader) (*Request, error)"},
  8489  		{"NewResponseController", Func, 20, "func(rw ResponseWriter) *ResponseController"},
  8490  		{"NewServeMux", Func, 0, "func() *ServeMux"},
  8491  		{"NoBody", Var, 8, ""},
  8492  		{"NotFound", Func, 0, "func(w ResponseWriter, r *Request)"},
  8493  		{"NotFoundHandler", Func, 0, "func() Handler"},
  8494  		{"ParseCookie", Func, 23, "func(line string) ([]*Cookie, error)"},
  8495  		{"ParseHTTPVersion", Func, 0, "func(vers string) (major int, minor int, ok bool)"},
  8496  		{"ParseSetCookie", Func, 23, "func(line string) (*Cookie, error)"},
  8497  		{"ParseTime", Func, 1, "func(text string) (t time.Time, err error)"},
  8498  		{"Post", Func, 0, "func(url string, contentType string, body io.Reader) (resp *Response, err error)"},
  8499  		{"PostForm", Func, 0, "func(url string, data url.Values) (resp *Response, err error)"},
  8500  		{"ProtocolError", Type, 0, ""},
  8501  		{"ProtocolError.ErrorString", Field, 0, ""},
  8502  		{"Protocols", Type, 24, ""},
  8503  		{"ProxyFromEnvironment", Func, 0, "func(req *Request) (*url.URL, error)"},
  8504  		{"ProxyURL", Func, 0, "func(fixedURL *url.URL) func(*Request) (*url.URL, error)"},
  8505  		{"PushOptions", Type, 8, ""},
  8506  		{"PushOptions.Header", Field, 8, ""},
  8507  		{"PushOptions.Method", Field, 8, ""},
  8508  		{"Pusher", Type, 8, ""},
  8509  		{"ReadRequest", Func, 0, "func(b *bufio.Reader) (*Request, error)"},
  8510  		{"ReadResponse", Func, 0, "func(r *bufio.Reader, req *Request) (*Response, error)"},
  8511  		{"Redirect", Func, 0, "func(w ResponseWriter, r *Request, url string, code int)"},
  8512  		{"RedirectHandler", Func, 0, "func(url string, code int) Handler"},
  8513  		{"Request", Type, 0, ""},
  8514  		{"Request.Body", Field, 0, ""},
  8515  		{"Request.Cancel", Field, 5, ""},
  8516  		{"Request.Close", Field, 0, ""},
  8517  		{"Request.ContentLength", Field, 0, ""},
  8518  		{"Request.Form", Field, 0, ""},
  8519  		{"Request.GetBody", Field, 8, ""},
  8520  		{"Request.Header", Field, 0, ""},
  8521  		{"Request.Host", Field, 0, ""},
  8522  		{"Request.Method", Field, 0, ""},
  8523  		{"Request.MultipartForm", Field, 0, ""},
  8524  		{"Request.Pattern", Field, 23, ""},
  8525  		{"Request.PostForm", Field, 1, ""},
  8526  		{"Request.Proto", Field, 0, ""},
  8527  		{"Request.ProtoMajor", Field, 0, ""},
  8528  		{"Request.ProtoMinor", Field, 0, ""},
  8529  		{"Request.RemoteAddr", Field, 0, ""},
  8530  		{"Request.RequestURI", Field, 0, ""},
  8531  		{"Request.Response", Field, 7, ""},
  8532  		{"Request.TLS", Field, 0, ""},
  8533  		{"Request.Trailer", Field, 0, ""},
  8534  		{"Request.TransferEncoding", Field, 0, ""},
  8535  		{"Request.URL", Field, 0, ""},
  8536  		{"Response", Type, 0, ""},
  8537  		{"Response.Body", Field, 0, ""},
  8538  		{"Response.Close", Field, 0, ""},
  8539  		{"Response.ContentLength", Field, 0, ""},
  8540  		{"Response.Header", Field, 0, ""},
  8541  		{"Response.Proto", Field, 0, ""},
  8542  		{"Response.ProtoMajor", Field, 0, ""},
  8543  		{"Response.ProtoMinor", Field, 0, ""},
  8544  		{"Response.Request", Field, 0, ""},
  8545  		{"Response.Status", Field, 0, ""},
  8546  		{"Response.StatusCode", Field, 0, ""},
  8547  		{"Response.TLS", Field, 3, ""},
  8548  		{"Response.Trailer", Field, 0, ""},
  8549  		{"Response.TransferEncoding", Field, 0, ""},
  8550  		{"Response.Uncompressed", Field, 7, ""},
  8551  		{"ResponseController", Type, 20, ""},
  8552  		{"ResponseWriter", Type, 0, ""},
  8553  		{"RoundTripper", Type, 0, ""},
  8554  		{"SameSite", Type, 11, ""},
  8555  		{"SameSiteDefaultMode", Const, 11, ""},
  8556  		{"SameSiteLaxMode", Const, 11, ""},
  8557  		{"SameSiteNoneMode", Const, 13, ""},
  8558  		{"SameSiteStrictMode", Const, 11, ""},
  8559  		{"Serve", Func, 0, "func(l net.Listener, handler Handler) error"},
  8560  		{"ServeContent", Func, 0, "func(w ResponseWriter, req *Request, name string, modtime time.Time, content io.ReadSeeker)"},
  8561  		{"ServeFile", Func, 0, "func(w ResponseWriter, r *Request, name string)"},
  8562  		{"ServeFileFS", Func, 22, "func(w ResponseWriter, r *Request, fsys fs.FS, name string)"},
  8563  		{"ServeMux", Type, 0, ""},
  8564  		{"ServeTLS", Func, 9, "func(l net.Listener, handler Handler, certFile string, keyFile string) error"},
  8565  		{"Server", Type, 0, ""},
  8566  		{"Server.Addr", Field, 0, ""},
  8567  		{"Server.BaseContext", Field, 13, ""},
  8568  		{"Server.ConnContext", Field, 13, ""},
  8569  		{"Server.ConnState", Field, 3, ""},
  8570  		{"Server.DisableGeneralOptionsHandler", Field, 20, ""},
  8571  		{"Server.ErrorLog", Field, 3, ""},
  8572  		{"Server.HTTP2", Field, 24, ""},
  8573  		{"Server.Handler", Field, 0, ""},
  8574  		{"Server.IdleTimeout", Field, 8, ""},
  8575  		{"Server.MaxHeaderBytes", Field, 0, ""},
  8576  		{"Server.Protocols", Field, 24, ""},
  8577  		{"Server.ReadHeaderTimeout", Field, 8, ""},
  8578  		{"Server.ReadTimeout", Field, 0, ""},
  8579  		{"Server.TLSConfig", Field, 0, ""},
  8580  		{"Server.TLSNextProto", Field, 1, ""},
  8581  		{"Server.WriteTimeout", Field, 0, ""},
  8582  		{"ServerContextKey", Var, 7, ""},
  8583  		{"SetCookie", Func, 0, "func(w ResponseWriter, cookie *Cookie)"},
  8584  		{"StateActive", Const, 3, ""},
  8585  		{"StateClosed", Const, 3, ""},
  8586  		{"StateHijacked", Const, 3, ""},
  8587  		{"StateIdle", Const, 3, ""},
  8588  		{"StateNew", Const, 3, ""},
  8589  		{"StatusAccepted", Const, 0, ""},
  8590  		{"StatusAlreadyReported", Const, 7, ""},
  8591  		{"StatusBadGateway", Const, 0, ""},
  8592  		{"StatusBadRequest", Const, 0, ""},
  8593  		{"StatusConflict", Const, 0, ""},
  8594  		{"StatusContinue", Const, 0, ""},
  8595  		{"StatusCreated", Const, 0, ""},
  8596  		{"StatusEarlyHints", Const, 13, ""},
  8597  		{"StatusExpectationFailed", Const, 0, ""},
  8598  		{"StatusFailedDependency", Const, 7, ""},
  8599  		{"StatusForbidden", Const, 0, ""},
  8600  		{"StatusFound", Const, 0, ""},
  8601  		{"StatusGatewayTimeout", Const, 0, ""},
  8602  		{"StatusGone", Const, 0, ""},
  8603  		{"StatusHTTPVersionNotSupported", Const, 0, ""},
  8604  		{"StatusIMUsed", Const, 7, ""},
  8605  		{"StatusInsufficientStorage", Const, 7, ""},
  8606  		{"StatusInternalServerError", Const, 0, ""},
  8607  		{"StatusLengthRequired", Const, 0, ""},
  8608  		{"StatusLocked", Const, 7, ""},
  8609  		{"StatusLoopDetected", Const, 7, ""},
  8610  		{"StatusMethodNotAllowed", Const, 0, ""},
  8611  		{"StatusMisdirectedRequest", Const, 11, ""},
  8612  		{"StatusMovedPermanently", Const, 0, ""},
  8613  		{"StatusMultiStatus", Const, 7, ""},
  8614  		{"StatusMultipleChoices", Const, 0, ""},
  8615  		{"StatusNetworkAuthenticationRequired", Const, 6, ""},
  8616  		{"StatusNoContent", Const, 0, ""},
  8617  		{"StatusNonAuthoritativeInfo", Const, 0, ""},
  8618  		{"StatusNotAcceptable", Const, 0, ""},
  8619  		{"StatusNotExtended", Const, 7, ""},
  8620  		{"StatusNotFound", Const, 0, ""},
  8621  		{"StatusNotImplemented", Const, 0, ""},
  8622  		{"StatusNotModified", Const, 0, ""},
  8623  		{"StatusOK", Const, 0, ""},
  8624  		{"StatusPartialContent", Const, 0, ""},
  8625  		{"StatusPaymentRequired", Const, 0, ""},
  8626  		{"StatusPermanentRedirect", Const, 7, ""},
  8627  		{"StatusPreconditionFailed", Const, 0, ""},
  8628  		{"StatusPreconditionRequired", Const, 6, ""},
  8629  		{"StatusProcessing", Const, 7, ""},
  8630  		{"StatusProxyAuthRequired", Const, 0, ""},
  8631  		{"StatusRequestEntityTooLarge", Const, 0, ""},
  8632  		{"StatusRequestHeaderFieldsTooLarge", Const, 6, ""},
  8633  		{"StatusRequestTimeout", Const, 0, ""},
  8634  		{"StatusRequestURITooLong", Const, 0, ""},
  8635  		{"StatusRequestedRangeNotSatisfiable", Const, 0, ""},
  8636  		{"StatusResetContent", Const, 0, ""},
  8637  		{"StatusSeeOther", Const, 0, ""},
  8638  		{"StatusServiceUnavailable", Const, 0, ""},
  8639  		{"StatusSwitchingProtocols", Const, 0, ""},
  8640  		{"StatusTeapot", Const, 0, ""},
  8641  		{"StatusTemporaryRedirect", Const, 0, ""},
  8642  		{"StatusText", Func, 0, "func(code int) string"},
  8643  		{"StatusTooEarly", Const, 12, ""},
  8644  		{"StatusTooManyRequests", Const, 6, ""},
  8645  		{"StatusUnauthorized", Const, 0, ""},
  8646  		{"StatusUnavailableForLegalReasons", Const, 6, ""},
  8647  		{"StatusUnprocessableEntity", Const, 7, ""},
  8648  		{"StatusUnsupportedMediaType", Const, 0, ""},
  8649  		{"StatusUpgradeRequired", Const, 7, ""},
  8650  		{"StatusUseProxy", Const, 0, ""},
  8651  		{"StatusVariantAlsoNegotiates", Const, 7, ""},
  8652  		{"StripPrefix", Func, 0, "func(prefix string, h Handler) Handler"},
  8653  		{"TimeFormat", Const, 0, ""},
  8654  		{"TimeoutHandler", Func, 0, "func(h Handler, dt time.Duration, msg string) Handler"},
  8655  		{"TrailerPrefix", Const, 8, ""},
  8656  		{"Transport", Type, 0, ""},
  8657  		{"Transport.Dial", Field, 0, ""},
  8658  		{"Transport.DialContext", Field, 7, ""},
  8659  		{"Transport.DialTLS", Field, 4, ""},
  8660  		{"Transport.DialTLSContext", Field, 14, ""},
  8661  		{"Transport.DisableCompression", Field, 0, ""},
  8662  		{"Transport.DisableKeepAlives", Field, 0, ""},
  8663  		{"Transport.ExpectContinueTimeout", Field, 6, ""},
  8664  		{"Transport.ForceAttemptHTTP2", Field, 13, ""},
  8665  		{"Transport.GetProxyConnectHeader", Field, 16, ""},
  8666  		{"Transport.HTTP2", Field, 24, ""},
  8667  		{"Transport.IdleConnTimeout", Field, 7, ""},
  8668  		{"Transport.MaxConnsPerHost", Field, 11, ""},
  8669  		{"Transport.MaxIdleConns", Field, 7, ""},
  8670  		{"Transport.MaxIdleConnsPerHost", Field, 0, ""},
  8671  		{"Transport.MaxResponseHeaderBytes", Field, 7, ""},
  8672  		{"Transport.OnProxyConnectResponse", Field, 20, ""},
  8673  		{"Transport.Protocols", Field, 24, ""},
  8674  		{"Transport.Proxy", Field, 0, ""},
  8675  		{"Transport.ProxyConnectHeader", Field, 8, ""},
  8676  		{"Transport.ReadBufferSize", Field, 13, ""},
  8677  		{"Transport.ResponseHeaderTimeout", Field, 1, ""},
  8678  		{"Transport.TLSClientConfig", Field, 0, ""},
  8679  		{"Transport.TLSHandshakeTimeout", Field, 3, ""},
  8680  		{"Transport.TLSNextProto", Field, 6, ""},
  8681  		{"Transport.WriteBufferSize", Field, 13, ""},
  8682  	},
  8683  	"net/http/cgi": {
  8684  		{"(*Handler).ServeHTTP", Method, 0, ""},
  8685  		{"Handler", Type, 0, ""},
  8686  		{"Handler.Args", Field, 0, ""},
  8687  		{"Handler.Dir", Field, 0, ""},
  8688  		{"Handler.Env", Field, 0, ""},
  8689  		{"Handler.InheritEnv", Field, 0, ""},
  8690  		{"Handler.Logger", Field, 0, ""},
  8691  		{"Handler.Path", Field, 0, ""},
  8692  		{"Handler.PathLocationHandler", Field, 0, ""},
  8693  		{"Handler.Root", Field, 0, ""},
  8694  		{"Handler.Stderr", Field, 7, ""},
  8695  		{"Request", Func, 0, "func() (*http.Request, error)"},
  8696  		{"RequestFromMap", Func, 0, "func(params map[string]string) (*http.Request, error)"},
  8697  		{"Serve", Func, 0, "func(handler http.Handler) error"},
  8698  	},
  8699  	"net/http/cookiejar": {
  8700  		{"(*Jar).Cookies", Method, 1, ""},
  8701  		{"(*Jar).SetCookies", Method, 1, ""},
  8702  		{"Jar", Type, 1, ""},
  8703  		{"New", Func, 1, "func(o *Options) (*Jar, error)"},
  8704  		{"Options", Type, 1, ""},
  8705  		{"Options.PublicSuffixList", Field, 1, ""},
  8706  		{"PublicSuffixList", Type, 1, ""},
  8707  	},
  8708  	"net/http/fcgi": {
  8709  		{"ErrConnClosed", Var, 5, ""},
  8710  		{"ErrRequestAborted", Var, 5, ""},
  8711  		{"ProcessEnv", Func, 9, "func(r *http.Request) map[string]string"},
  8712  		{"Serve", Func, 0, "func(l net.Listener, handler http.Handler) error"},
  8713  	},
  8714  	"net/http/httptest": {
  8715  		{"(*ResponseRecorder).Flush", Method, 0, ""},
  8716  		{"(*ResponseRecorder).Header", Method, 0, ""},
  8717  		{"(*ResponseRecorder).Result", Method, 7, ""},
  8718  		{"(*ResponseRecorder).Write", Method, 0, ""},
  8719  		{"(*ResponseRecorder).WriteHeader", Method, 0, ""},
  8720  		{"(*ResponseRecorder).WriteString", Method, 6, ""},
  8721  		{"(*Server).Certificate", Method, 9, ""},
  8722  		{"(*Server).Client", Method, 9, ""},
  8723  		{"(*Server).Close", Method, 0, ""},
  8724  		{"(*Server).CloseClientConnections", Method, 0, ""},
  8725  		{"(*Server).Start", Method, 0, ""},
  8726  		{"(*Server).StartTLS", Method, 0, ""},
  8727  		{"DefaultRemoteAddr", Const, 0, ""},
  8728  		{"NewRecorder", Func, 0, "func() *ResponseRecorder"},
  8729  		{"NewRequest", Func, 7, "func(method string, target string, body io.Reader) *http.Request"},
  8730  		{"NewRequestWithContext", Func, 23, "func(ctx context.Context, method string, target string, body io.Reader) *http.Request"},
  8731  		{"NewServer", Func, 0, "func(handler http.Handler) *Server"},
  8732  		{"NewTLSServer", Func, 0, "func(handler http.Handler) *Server"},
  8733  		{"NewUnstartedServer", Func, 0, "func(handler http.Handler) *Server"},
  8734  		{"ResponseRecorder", Type, 0, ""},
  8735  		{"ResponseRecorder.Body", Field, 0, ""},
  8736  		{"ResponseRecorder.Code", Field, 0, ""},
  8737  		{"ResponseRecorder.Flushed", Field, 0, ""},
  8738  		{"ResponseRecorder.HeaderMap", Field, 0, ""},
  8739  		{"Server", Type, 0, ""},
  8740  		{"Server.Config", Field, 0, ""},
  8741  		{"Server.EnableHTTP2", Field, 14, ""},
  8742  		{"Server.Listener", Field, 0, ""},
  8743  		{"Server.TLS", Field, 0, ""},
  8744  		{"Server.URL", Field, 0, ""},
  8745  	},
  8746  	"net/http/httptrace": {
  8747  		{"ClientTrace", Type, 7, ""},
  8748  		{"ClientTrace.ConnectDone", Field, 7, ""},
  8749  		{"ClientTrace.ConnectStart", Field, 7, ""},
  8750  		{"ClientTrace.DNSDone", Field, 7, ""},
  8751  		{"ClientTrace.DNSStart", Field, 7, ""},
  8752  		{"ClientTrace.GetConn", Field, 7, ""},
  8753  		{"ClientTrace.Got100Continue", Field, 7, ""},
  8754  		{"ClientTrace.Got1xxResponse", Field, 11, ""},
  8755  		{"ClientTrace.GotConn", Field, 7, ""},
  8756  		{"ClientTrace.GotFirstResponseByte", Field, 7, ""},
  8757  		{"ClientTrace.PutIdleConn", Field, 7, ""},
  8758  		{"ClientTrace.TLSHandshakeDone", Field, 8, ""},
  8759  		{"ClientTrace.TLSHandshakeStart", Field, 8, ""},
  8760  		{"ClientTrace.Wait100Continue", Field, 7, ""},
  8761  		{"ClientTrace.WroteHeaderField", Field, 11, ""},
  8762  		{"ClientTrace.WroteHeaders", Field, 7, ""},
  8763  		{"ClientTrace.WroteRequest", Field, 7, ""},
  8764  		{"ContextClientTrace", Func, 7, "func(ctx context.Context) *ClientTrace"},
  8765  		{"DNSDoneInfo", Type, 7, ""},
  8766  		{"DNSDoneInfo.Addrs", Field, 7, ""},
  8767  		{"DNSDoneInfo.Coalesced", Field, 7, ""},
  8768  		{"DNSDoneInfo.Err", Field, 7, ""},
  8769  		{"DNSStartInfo", Type, 7, ""},
  8770  		{"DNSStartInfo.Host", Field, 7, ""},
  8771  		{"GotConnInfo", Type, 7, ""},
  8772  		{"GotConnInfo.Conn", Field, 7, ""},
  8773  		{"GotConnInfo.IdleTime", Field, 7, ""},
  8774  		{"GotConnInfo.Reused", Field, 7, ""},
  8775  		{"GotConnInfo.WasIdle", Field, 7, ""},
  8776  		{"WithClientTrace", Func, 7, "func(ctx context.Context, trace *ClientTrace) context.Context"},
  8777  		{"WroteRequestInfo", Type, 7, ""},
  8778  		{"WroteRequestInfo.Err", Field, 7, ""},
  8779  	},
  8780  	"net/http/httputil": {
  8781  		{"(*ClientConn).Close", Method, 0, ""},
  8782  		{"(*ClientConn).Do", Method, 0, ""},
  8783  		{"(*ClientConn).Hijack", Method, 0, ""},
  8784  		{"(*ClientConn).Pending", Method, 0, ""},
  8785  		{"(*ClientConn).Read", Method, 0, ""},
  8786  		{"(*ClientConn).Write", Method, 0, ""},
  8787  		{"(*ProxyRequest).SetURL", Method, 20, ""},
  8788  		{"(*ProxyRequest).SetXForwarded", Method, 20, ""},
  8789  		{"(*ReverseProxy).ServeHTTP", Method, 0, ""},
  8790  		{"(*ServerConn).Close", Method, 0, ""},
  8791  		{"(*ServerConn).Hijack", Method, 0, ""},
  8792  		{"(*ServerConn).Pending", Method, 0, ""},
  8793  		{"(*ServerConn).Read", Method, 0, ""},
  8794  		{"(*ServerConn).Write", Method, 0, ""},
  8795  		{"BufferPool", Type, 6, ""},
  8796  		{"ClientConn", Type, 0, ""},
  8797  		{"DumpRequest", Func, 0, "func(req *http.Request, body bool) ([]byte, error)"},
  8798  		{"DumpRequestOut", Func, 0, "func(req *http.Request, body bool) ([]byte, error)"},
  8799  		{"DumpResponse", Func, 0, "func(resp *http.Response, body bool) ([]byte, error)"},
  8800  		{"ErrClosed", Var, 0, ""},
  8801  		{"ErrLineTooLong", Var, 0, ""},
  8802  		{"ErrPersistEOF", Var, 0, ""},
  8803  		{"ErrPipeline", Var, 0, ""},
  8804  		{"NewChunkedReader", Func, 0, "func(r io.Reader) io.Reader"},
  8805  		{"NewChunkedWriter", Func, 0, "func(w io.Writer) io.WriteCloser"},
  8806  		{"NewClientConn", Func, 0, "func(c net.Conn, r *bufio.Reader) *ClientConn"},
  8807  		{"NewProxyClientConn", Func, 0, "func(c net.Conn, r *bufio.Reader) *ClientConn"},
  8808  		{"NewServerConn", Func, 0, "func(c net.Conn, r *bufio.Reader) *ServerConn"},
  8809  		{"NewSingleHostReverseProxy", Func, 0, "func(target *url.URL) *ReverseProxy"},
  8810  		{"ProxyRequest", Type, 20, ""},
  8811  		{"ProxyRequest.In", Field, 20, ""},
  8812  		{"ProxyRequest.Out", Field, 20, ""},
  8813  		{"ReverseProxy", Type, 0, ""},
  8814  		{"ReverseProxy.BufferPool", Field, 6, ""},
  8815  		{"ReverseProxy.Director", Field, 0, ""},
  8816  		{"ReverseProxy.ErrorHandler", Field, 11, ""},
  8817  		{"ReverseProxy.ErrorLog", Field, 4, ""},
  8818  		{"ReverseProxy.FlushInterval", Field, 0, ""},
  8819  		{"ReverseProxy.ModifyResponse", Field, 8, ""},
  8820  		{"ReverseProxy.Rewrite", Field, 20, ""},
  8821  		{"ReverseProxy.Transport", Field, 0, ""},
  8822  		{"ServerConn", Type, 0, ""},
  8823  	},
  8824  	"net/http/pprof": {
  8825  		{"Cmdline", Func, 0, "func(w http.ResponseWriter, r *http.Request)"},
  8826  		{"Handler", Func, 0, "func(name string) http.Handler"},
  8827  		{"Index", Func, 0, "func(w http.ResponseWriter, r *http.Request)"},
  8828  		{"Profile", Func, 0, "func(w http.ResponseWriter, r *http.Request)"},
  8829  		{"Symbol", Func, 0, "func(w http.ResponseWriter, r *http.Request)"},
  8830  		{"Trace", Func, 5, "func(w http.ResponseWriter, r *http.Request)"},
  8831  	},
  8832  	"net/mail": {
  8833  		{"(*Address).String", Method, 0, ""},
  8834  		{"(*AddressParser).Parse", Method, 5, ""},
  8835  		{"(*AddressParser).ParseList", Method, 5, ""},
  8836  		{"(Header).AddressList", Method, 0, ""},
  8837  		{"(Header).Date", Method, 0, ""},
  8838  		{"(Header).Get", Method, 0, ""},
  8839  		{"Address", Type, 0, ""},
  8840  		{"Address.Address", Field, 0, ""},
  8841  		{"Address.Name", Field, 0, ""},
  8842  		{"AddressParser", Type, 5, ""},
  8843  		{"AddressParser.WordDecoder", Field, 5, ""},
  8844  		{"ErrHeaderNotPresent", Var, 0, ""},
  8845  		{"Header", Type, 0, ""},
  8846  		{"Message", Type, 0, ""},
  8847  		{"Message.Body", Field, 0, ""},
  8848  		{"Message.Header", Field, 0, ""},
  8849  		{"ParseAddress", Func, 1, "func(address string) (*Address, error)"},
  8850  		{"ParseAddressList", Func, 1, "func(list string) ([]*Address, error)"},
  8851  		{"ParseDate", Func, 8, "func(date string) (time.Time, error)"},
  8852  		{"ReadMessage", Func, 0, "func(r io.Reader) (msg *Message, err error)"},
  8853  	},
  8854  	"net/netip": {
  8855  		{"(*Addr).UnmarshalBinary", Method, 18, ""},
  8856  		{"(*Addr).UnmarshalText", Method, 18, ""},
  8857  		{"(*AddrPort).UnmarshalBinary", Method, 18, ""},
  8858  		{"(*AddrPort).UnmarshalText", Method, 18, ""},
  8859  		{"(*Prefix).UnmarshalBinary", Method, 18, ""},
  8860  		{"(*Prefix).UnmarshalText", Method, 18, ""},
  8861  		{"(Addr).AppendBinary", Method, 24, ""},
  8862  		{"(Addr).AppendText", Method, 24, ""},
  8863  		{"(Addr).AppendTo", Method, 18, ""},
  8864  		{"(Addr).As16", Method, 18, ""},
  8865  		{"(Addr).As4", Method, 18, ""},
  8866  		{"(Addr).AsSlice", Method, 18, ""},
  8867  		{"(Addr).BitLen", Method, 18, ""},
  8868  		{"(Addr).Compare", Method, 18, ""},
  8869  		{"(Addr).Is4", Method, 18, ""},
  8870  		{"(Addr).Is4In6", Method, 18, ""},
  8871  		{"(Addr).Is6", Method, 18, ""},
  8872  		{"(Addr).IsGlobalUnicast", Method, 18, ""},
  8873  		{"(Addr).IsInterfaceLocalMulticast", Method, 18, ""},
  8874  		{"(Addr).IsLinkLocalMulticast", Method, 18, ""},
  8875  		{"(Addr).IsLinkLocalUnicast", Method, 18, ""},
  8876  		{"(Addr).IsLoopback", Method, 18, ""},
  8877  		{"(Addr).IsMulticast", Method, 18, ""},
  8878  		{"(Addr).IsPrivate", Method, 18, ""},
  8879  		{"(Addr).IsUnspecified", Method, 18, ""},
  8880  		{"(Addr).IsValid", Method, 18, ""},
  8881  		{"(Addr).Less", Method, 18, ""},
  8882  		{"(Addr).MarshalBinary", Method, 18, ""},
  8883  		{"(Addr).MarshalText", Method, 18, ""},
  8884  		{"(Addr).Next", Method, 18, ""},
  8885  		{"(Addr).Prefix", Method, 18, ""},
  8886  		{"(Addr).Prev", Method, 18, ""},
  8887  		{"(Addr).String", Method, 18, ""},
  8888  		{"(Addr).StringExpanded", Method, 18, ""},
  8889  		{"(Addr).Unmap", Method, 18, ""},
  8890  		{"(Addr).WithZone", Method, 18, ""},
  8891  		{"(Addr).Zone", Method, 18, ""},
  8892  		{"(AddrPort).Addr", Method, 18, ""},
  8893  		{"(AddrPort).AppendBinary", Method, 24, ""},
  8894  		{"(AddrPort).AppendText", Method, 24, ""},
  8895  		{"(AddrPort).AppendTo", Method, 18, ""},
  8896  		{"(AddrPort).Compare", Method, 22, ""},
  8897  		{"(AddrPort).IsValid", Method, 18, ""},
  8898  		{"(AddrPort).MarshalBinary", Method, 18, ""},
  8899  		{"(AddrPort).MarshalText", Method, 18, ""},
  8900  		{"(AddrPort).Port", Method, 18, ""},
  8901  		{"(AddrPort).String", Method, 18, ""},
  8902  		{"(Prefix).Addr", Method, 18, ""},
  8903  		{"(Prefix).AppendBinary", Method, 24, ""},
  8904  		{"(Prefix).AppendText", Method, 24, ""},
  8905  		{"(Prefix).AppendTo", Method, 18, ""},
  8906  		{"(Prefix).Bits", Method, 18, ""},
  8907  		{"(Prefix).Contains", Method, 18, ""},
  8908  		{"(Prefix).IsSingleIP", Method, 18, ""},
  8909  		{"(Prefix).IsValid", Method, 18, ""},
  8910  		{"(Prefix).MarshalBinary", Method, 18, ""},
  8911  		{"(Prefix).MarshalText", Method, 18, ""},
  8912  		{"(Prefix).Masked", Method, 18, ""},
  8913  		{"(Prefix).Overlaps", Method, 18, ""},
  8914  		{"(Prefix).String", Method, 18, ""},
  8915  		{"Addr", Type, 18, ""},
  8916  		{"AddrFrom16", Func, 18, "func(addr [16]byte) Addr"},
  8917  		{"AddrFrom4", Func, 18, "func(addr [4]byte) Addr"},
  8918  		{"AddrFromSlice", Func, 18, "func(slice []byte) (ip Addr, ok bool)"},
  8919  		{"AddrPort", Type, 18, ""},
  8920  		{"AddrPortFrom", Func, 18, "func(ip Addr, port uint16) AddrPort"},
  8921  		{"IPv4Unspecified", Func, 18, "func() Addr"},
  8922  		{"IPv6LinkLocalAllNodes", Func, 18, "func() Addr"},
  8923  		{"IPv6LinkLocalAllRouters", Func, 20, "func() Addr"},
  8924  		{"IPv6Loopback", Func, 20, "func() Addr"},
  8925  		{"IPv6Unspecified", Func, 18, "func() Addr"},
  8926  		{"MustParseAddr", Func, 18, "func(s string) Addr"},
  8927  		{"MustParseAddrPort", Func, 18, "func(s string) AddrPort"},
  8928  		{"MustParsePrefix", Func, 18, "func(s string) Prefix"},
  8929  		{"ParseAddr", Func, 18, "func(s string) (Addr, error)"},
  8930  		{"ParseAddrPort", Func, 18, "func(s string) (AddrPort, error)"},
  8931  		{"ParsePrefix", Func, 18, "func(s string) (Prefix, error)"},
  8932  		{"Prefix", Type, 18, ""},
  8933  		{"PrefixFrom", Func, 18, "func(ip Addr, bits int) Prefix"},
  8934  	},
  8935  	"net/rpc": {
  8936  		{"(*Client).Call", Method, 0, ""},
  8937  		{"(*Client).Close", Method, 0, ""},
  8938  		{"(*Client).Go", Method, 0, ""},
  8939  		{"(*Server).Accept", Method, 0, ""},
  8940  		{"(*Server).HandleHTTP", Method, 0, ""},
  8941  		{"(*Server).Register", Method, 0, ""},
  8942  		{"(*Server).RegisterName", Method, 0, ""},
  8943  		{"(*Server).ServeCodec", Method, 0, ""},
  8944  		{"(*Server).ServeConn", Method, 0, ""},
  8945  		{"(*Server).ServeHTTP", Method, 0, ""},
  8946  		{"(*Server).ServeRequest", Method, 0, ""},
  8947  		{"(ServerError).Error", Method, 0, ""},
  8948  		{"Accept", Func, 0, "func(lis net.Listener)"},
  8949  		{"Call", Type, 0, ""},
  8950  		{"Call.Args", Field, 0, ""},
  8951  		{"Call.Done", Field, 0, ""},
  8952  		{"Call.Error", Field, 0, ""},
  8953  		{"Call.Reply", Field, 0, ""},
  8954  		{"Call.ServiceMethod", Field, 0, ""},
  8955  		{"Client", Type, 0, ""},
  8956  		{"ClientCodec", Type, 0, ""},
  8957  		{"DefaultDebugPath", Const, 0, ""},
  8958  		{"DefaultRPCPath", Const, 0, ""},
  8959  		{"DefaultServer", Var, 0, ""},
  8960  		{"Dial", Func, 0, "func(network string, address string) (*Client, error)"},
  8961  		{"DialHTTP", Func, 0, "func(network string, address string) (*Client, error)"},
  8962  		{"DialHTTPPath", Func, 0, "func(network string, address string, path string) (*Client, error)"},
  8963  		{"ErrShutdown", Var, 0, ""},
  8964  		{"HandleHTTP", Func, 0, "func()"},
  8965  		{"NewClient", Func, 0, "func(conn io.ReadWriteCloser) *Client"},
  8966  		{"NewClientWithCodec", Func, 0, "func(codec ClientCodec) *Client"},
  8967  		{"NewServer", Func, 0, "func() *Server"},
  8968  		{"Register", Func, 0, "func(rcvr any) error"},
  8969  		{"RegisterName", Func, 0, "func(name string, rcvr any) error"},
  8970  		{"Request", Type, 0, ""},
  8971  		{"Request.Seq", Field, 0, ""},
  8972  		{"Request.ServiceMethod", Field, 0, ""},
  8973  		{"Response", Type, 0, ""},
  8974  		{"Response.Error", Field, 0, ""},
  8975  		{"Response.Seq", Field, 0, ""},
  8976  		{"Response.ServiceMethod", Field, 0, ""},
  8977  		{"ServeCodec", Func, 0, "func(codec ServerCodec)"},
  8978  		{"ServeConn", Func, 0, "func(conn io.ReadWriteCloser)"},
  8979  		{"ServeRequest", Func, 0, "func(codec ServerCodec) error"},
  8980  		{"Server", Type, 0, ""},
  8981  		{"ServerCodec", Type, 0, ""},
  8982  		{"ServerError", Type, 0, ""},
  8983  	},
  8984  	"net/rpc/jsonrpc": {
  8985  		{"Dial", Func, 0, "func(network string, address string) (*rpc.Client, error)"},
  8986  		{"NewClient", Func, 0, "func(conn io.ReadWriteCloser) *rpc.Client"},
  8987  		{"NewClientCodec", Func, 0, "func(conn io.ReadWriteCloser) rpc.ClientCodec"},
  8988  		{"NewServerCodec", Func, 0, "func(conn io.ReadWriteCloser) rpc.ServerCodec"},
  8989  		{"ServeConn", Func, 0, "func(conn io.ReadWriteCloser)"},
  8990  	},
  8991  	"net/smtp": {
  8992  		{"(*Client).Auth", Method, 0, ""},
  8993  		{"(*Client).Close", Method, 2, ""},
  8994  		{"(*Client).Data", Method, 0, ""},
  8995  		{"(*Client).Extension", Method, 0, ""},
  8996  		{"(*Client).Hello", Method, 1, ""},
  8997  		{"(*Client).Mail", Method, 0, ""},
  8998  		{"(*Client).Noop", Method, 10, ""},
  8999  		{"(*Client).Quit", Method, 0, ""},
  9000  		{"(*Client).Rcpt", Method, 0, ""},
  9001  		{"(*Client).Reset", Method, 0, ""},
  9002  		{"(*Client).StartTLS", Method, 0, ""},
  9003  		{"(*Client).TLSConnectionState", Method, 5, ""},
  9004  		{"(*Client).Verify", Method, 0, ""},
  9005  		{"Auth", Type, 0, ""},
  9006  		{"CRAMMD5Auth", Func, 0, "func(username string, secret string) Auth"},
  9007  		{"Client", Type, 0, ""},
  9008  		{"Client.Text", Field, 0, ""},
  9009  		{"Dial", Func, 0, "func(addr string) (*Client, error)"},
  9010  		{"NewClient", Func, 0, "func(conn net.Conn, host string) (*Client, error)"},
  9011  		{"PlainAuth", Func, 0, "func(identity string, username string, password string, host string) Auth"},
  9012  		{"SendMail", Func, 0, "func(addr string, a Auth, from string, to []string, msg []byte) error"},
  9013  		{"ServerInfo", Type, 0, ""},
  9014  		{"ServerInfo.Auth", Field, 0, ""},
  9015  		{"ServerInfo.Name", Field, 0, ""},
  9016  		{"ServerInfo.TLS", Field, 0, ""},
  9017  	},
  9018  	"net/textproto": {
  9019  		{"(*Conn).Close", Method, 0, ""},
  9020  		{"(*Conn).Cmd", Method, 0, ""},
  9021  		{"(*Conn).DotReader", Method, 0, ""},
  9022  		{"(*Conn).DotWriter", Method, 0, ""},
  9023  		{"(*Conn).EndRequest", Method, 0, ""},
  9024  		{"(*Conn).EndResponse", Method, 0, ""},
  9025  		{"(*Conn).Next", Method, 0, ""},
  9026  		{"(*Conn).PrintfLine", Method, 0, ""},
  9027  		{"(*Conn).ReadCodeLine", Method, 0, ""},
  9028  		{"(*Conn).ReadContinuedLine", Method, 0, ""},
  9029  		{"(*Conn).ReadContinuedLineBytes", Method, 0, ""},
  9030  		{"(*Conn).ReadDotBytes", Method, 0, ""},
  9031  		{"(*Conn).ReadDotLines", Method, 0, ""},
  9032  		{"(*Conn).ReadLine", Method, 0, ""},
  9033  		{"(*Conn).ReadLineBytes", Method, 0, ""},
  9034  		{"(*Conn).ReadMIMEHeader", Method, 0, ""},
  9035  		{"(*Conn).ReadResponse", Method, 0, ""},
  9036  		{"(*Conn).StartRequest", Method, 0, ""},
  9037  		{"(*Conn).StartResponse", Method, 0, ""},
  9038  		{"(*Error).Error", Method, 0, ""},
  9039  		{"(*Pipeline).EndRequest", Method, 0, ""},
  9040  		{"(*Pipeline).EndResponse", Method, 0, ""},
  9041  		{"(*Pipeline).Next", Method, 0, ""},
  9042  		{"(*Pipeline).StartRequest", Method, 0, ""},
  9043  		{"(*Pipeline).StartResponse", Method, 0, ""},
  9044  		{"(*Reader).DotReader", Method, 0, ""},
  9045  		{"(*Reader).ReadCodeLine", Method, 0, ""},
  9046  		{"(*Reader).ReadContinuedLine", Method, 0, ""},
  9047  		{"(*Reader).ReadContinuedLineBytes", Method, 0, ""},
  9048  		{"(*Reader).ReadDotBytes", Method, 0, ""},
  9049  		{"(*Reader).ReadDotLines", Method, 0, ""},
  9050  		{"(*Reader).ReadLine", Method, 0, ""},
  9051  		{"(*Reader).ReadLineBytes", Method, 0, ""},
  9052  		{"(*Reader).ReadMIMEHeader", Method, 0, ""},
  9053  		{"(*Reader).ReadResponse", Method, 0, ""},
  9054  		{"(*Writer).DotWriter", Method, 0, ""},
  9055  		{"(*Writer).PrintfLine", Method, 0, ""},
  9056  		{"(MIMEHeader).Add", Method, 0, ""},
  9057  		{"(MIMEHeader).Del", Method, 0, ""},
  9058  		{"(MIMEHeader).Get", Method, 0, ""},
  9059  		{"(MIMEHeader).Set", Method, 0, ""},
  9060  		{"(MIMEHeader).Values", Method, 14, ""},
  9061  		{"(ProtocolError).Error", Method, 0, ""},
  9062  		{"CanonicalMIMEHeaderKey", Func, 0, "func(s string) string"},
  9063  		{"Conn", Type, 0, ""},
  9064  		{"Conn.Pipeline", Field, 0, ""},
  9065  		{"Conn.Reader", Field, 0, ""},
  9066  		{"Conn.Writer", Field, 0, ""},
  9067  		{"Dial", Func, 0, "func(network string, addr string) (*Conn, error)"},
  9068  		{"Error", Type, 0, ""},
  9069  		{"Error.Code", Field, 0, ""},
  9070  		{"Error.Msg", Field, 0, ""},
  9071  		{"MIMEHeader", Type, 0, ""},
  9072  		{"NewConn", Func, 0, "func(conn io.ReadWriteCloser) *Conn"},
  9073  		{"NewReader", Func, 0, "func(r *bufio.Reader) *Reader"},
  9074  		{"NewWriter", Func, 0, "func(w *bufio.Writer) *Writer"},
  9075  		{"Pipeline", Type, 0, ""},
  9076  		{"ProtocolError", Type, 0, ""},
  9077  		{"Reader", Type, 0, ""},
  9078  		{"Reader.R", Field, 0, ""},
  9079  		{"TrimBytes", Func, 1, "func(b []byte) []byte"},
  9080  		{"TrimString", Func, 1, "func(s string) string"},
  9081  		{"Writer", Type, 0, ""},
  9082  		{"Writer.W", Field, 0, ""},
  9083  	},
  9084  	"net/url": {
  9085  		{"(*Error).Error", Method, 0, ""},
  9086  		{"(*Error).Temporary", Method, 6, ""},
  9087  		{"(*Error).Timeout", Method, 6, ""},
  9088  		{"(*Error).Unwrap", Method, 13, ""},
  9089  		{"(*URL).AppendBinary", Method, 24, ""},
  9090  		{"(*URL).EscapedFragment", Method, 15, ""},
  9091  		{"(*URL).EscapedPath", Method, 5, ""},
  9092  		{"(*URL).Hostname", Method, 8, ""},
  9093  		{"(*URL).IsAbs", Method, 0, ""},
  9094  		{"(*URL).JoinPath", Method, 19, ""},
  9095  		{"(*URL).MarshalBinary", Method, 8, ""},
  9096  		{"(*URL).Parse", Method, 0, ""},
  9097  		{"(*URL).Port", Method, 8, ""},
  9098  		{"(*URL).Query", Method, 0, ""},
  9099  		{"(*URL).Redacted", Method, 15, ""},
  9100  		{"(*URL).RequestURI", Method, 0, ""},
  9101  		{"(*URL).ResolveReference", Method, 0, ""},
  9102  		{"(*URL).String", Method, 0, ""},
  9103  		{"(*URL).UnmarshalBinary", Method, 8, ""},
  9104  		{"(*Userinfo).Password", Method, 0, ""},
  9105  		{"(*Userinfo).String", Method, 0, ""},
  9106  		{"(*Userinfo).Username", Method, 0, ""},
  9107  		{"(EscapeError).Error", Method, 0, ""},
  9108  		{"(InvalidHostError).Error", Method, 6, ""},
  9109  		{"(Values).Add", Method, 0, ""},
  9110  		{"(Values).Del", Method, 0, ""},
  9111  		{"(Values).Encode", Method, 0, ""},
  9112  		{"(Values).Get", Method, 0, ""},
  9113  		{"(Values).Has", Method, 17, ""},
  9114  		{"(Values).Set", Method, 0, ""},
  9115  		{"Error", Type, 0, ""},
  9116  		{"Error.Err", Field, 0, ""},
  9117  		{"Error.Op", Field, 0, ""},
  9118  		{"Error.URL", Field, 0, ""},
  9119  		{"EscapeError", Type, 0, ""},
  9120  		{"InvalidHostError", Type, 6, ""},
  9121  		{"JoinPath", Func, 19, "func(base string, elem ...string) (result string, err error)"},
  9122  		{"Parse", Func, 0, "func(rawURL string) (*URL, error)"},
  9123  		{"ParseQuery", Func, 0, "func(query string) (Values, error)"},
  9124  		{"ParseRequestURI", Func, 0, "func(rawURL string) (*URL, error)"},
  9125  		{"PathEscape", Func, 8, "func(s string) string"},
  9126  		{"PathUnescape", Func, 8, "func(s string) (string, error)"},
  9127  		{"QueryEscape", Func, 0, "func(s string) string"},
  9128  		{"QueryUnescape", Func, 0, "func(s string) (string, error)"},
  9129  		{"URL", Type, 0, ""},
  9130  		{"URL.ForceQuery", Field, 7, ""},
  9131  		{"URL.Fragment", Field, 0, ""},
  9132  		{"URL.Host", Field, 0, ""},
  9133  		{"URL.OmitHost", Field, 19, ""},
  9134  		{"URL.Opaque", Field, 0, ""},
  9135  		{"URL.Path", Field, 0, ""},
  9136  		{"URL.RawFragment", Field, 15, ""},
  9137  		{"URL.RawPath", Field, 5, ""},
  9138  		{"URL.RawQuery", Field, 0, ""},
  9139  		{"URL.Scheme", Field, 0, ""},
  9140  		{"URL.User", Field, 0, ""},
  9141  		{"User", Func, 0, "func(username string) *Userinfo"},
  9142  		{"UserPassword", Func, 0, "func(username string, password string) *Userinfo"},
  9143  		{"Userinfo", Type, 0, ""},
  9144  		{"Values", Type, 0, ""},
  9145  	},
  9146  	"os": {
  9147  		{"(*File).Chdir", Method, 0, ""},
  9148  		{"(*File).Chmod", Method, 0, ""},
  9149  		{"(*File).Chown", Method, 0, ""},
  9150  		{"(*File).Close", Method, 0, ""},
  9151  		{"(*File).Fd", Method, 0, ""},
  9152  		{"(*File).Name", Method, 0, ""},
  9153  		{"(*File).Read", Method, 0, ""},
  9154  		{"(*File).ReadAt", Method, 0, ""},
  9155  		{"(*File).ReadDir", Method, 16, ""},
  9156  		{"(*File).ReadFrom", Method, 15, ""},
  9157  		{"(*File).Readdir", Method, 0, ""},
  9158  		{"(*File).Readdirnames", Method, 0, ""},
  9159  		{"(*File).Seek", Method, 0, ""},
  9160  		{"(*File).SetDeadline", Method, 10, ""},
  9161  		{"(*File).SetReadDeadline", Method, 10, ""},
  9162  		{"(*File).SetWriteDeadline", Method, 10, ""},
  9163  		{"(*File).Stat", Method, 0, ""},
  9164  		{"(*File).Sync", Method, 0, ""},
  9165  		{"(*File).SyscallConn", Method, 12, ""},
  9166  		{"(*File).Truncate", Method, 0, ""},
  9167  		{"(*File).Write", Method, 0, ""},
  9168  		{"(*File).WriteAt", Method, 0, ""},
  9169  		{"(*File).WriteString", Method, 0, ""},
  9170  		{"(*File).WriteTo", Method, 22, ""},
  9171  		{"(*LinkError).Error", Method, 0, ""},
  9172  		{"(*LinkError).Unwrap", Method, 13, ""},
  9173  		{"(*PathError).Error", Method, 0, ""},
  9174  		{"(*PathError).Timeout", Method, 10, ""},
  9175  		{"(*PathError).Unwrap", Method, 13, ""},
  9176  		{"(*Process).Kill", Method, 0, ""},
  9177  		{"(*Process).Release", Method, 0, ""},
  9178  		{"(*Process).Signal", Method, 0, ""},
  9179  		{"(*Process).Wait", Method, 0, ""},
  9180  		{"(*ProcessState).ExitCode", Method, 12, ""},
  9181  		{"(*ProcessState).Exited", Method, 0, ""},
  9182  		{"(*ProcessState).Pid", Method, 0, ""},
  9183  		{"(*ProcessState).String", Method, 0, ""},
  9184  		{"(*ProcessState).Success", Method, 0, ""},
  9185  		{"(*ProcessState).Sys", Method, 0, ""},
  9186  		{"(*ProcessState).SysUsage", Method, 0, ""},
  9187  		{"(*ProcessState).SystemTime", Method, 0, ""},
  9188  		{"(*ProcessState).UserTime", Method, 0, ""},
  9189  		{"(*Root).Chmod", Method, 25, ""},
  9190  		{"(*Root).Chown", Method, 25, ""},
  9191  		{"(*Root).Chtimes", Method, 25, ""},
  9192  		{"(*Root).Close", Method, 24, ""},
  9193  		{"(*Root).Create", Method, 24, ""},
  9194  		{"(*Root).FS", Method, 24, ""},
  9195  		{"(*Root).Lchown", Method, 25, ""},
  9196  		{"(*Root).Link", Method, 25, ""},
  9197  		{"(*Root).Lstat", Method, 24, ""},
  9198  		{"(*Root).Mkdir", Method, 24, ""},
  9199  		{"(*Root).MkdirAll", Method, 25, ""},
  9200  		{"(*Root).Name", Method, 24, ""},
  9201  		{"(*Root).Open", Method, 24, ""},
  9202  		{"(*Root).OpenFile", Method, 24, ""},
  9203  		{"(*Root).OpenRoot", Method, 24, ""},
  9204  		{"(*Root).ReadFile", Method, 25, ""},
  9205  		{"(*Root).Readlink", Method, 25, ""},
  9206  		{"(*Root).Remove", Method, 24, ""},
  9207  		{"(*Root).RemoveAll", Method, 25, ""},
  9208  		{"(*Root).Rename", Method, 25, ""},
  9209  		{"(*Root).Stat", Method, 24, ""},
  9210  		{"(*Root).Symlink", Method, 25, ""},
  9211  		{"(*Root).WriteFile", Method, 25, ""},
  9212  		{"(*SyscallError).Error", Method, 0, ""},
  9213  		{"(*SyscallError).Timeout", Method, 10, ""},
  9214  		{"(*SyscallError).Unwrap", Method, 13, ""},
  9215  		{"(FileMode).IsDir", Method, 0, ""},
  9216  		{"(FileMode).IsRegular", Method, 1, ""},
  9217  		{"(FileMode).Perm", Method, 0, ""},
  9218  		{"(FileMode).String", Method, 0, ""},
  9219  		{"Args", Var, 0, ""},
  9220  		{"Chdir", Func, 0, "func(dir string) error"},
  9221  		{"Chmod", Func, 0, "func(name string, mode FileMode) error"},
  9222  		{"Chown", Func, 0, "func(name string, uid int, gid int) error"},
  9223  		{"Chtimes", Func, 0, "func(name string, atime time.Time, mtime time.Time) error"},
  9224  		{"Clearenv", Func, 0, "func()"},
  9225  		{"CopyFS", Func, 23, "func(dir string, fsys fs.FS) error"},
  9226  		{"Create", Func, 0, "func(name string) (*File, error)"},
  9227  		{"CreateTemp", Func, 16, "func(dir string, pattern string) (*File, error)"},
  9228  		{"DevNull", Const, 0, ""},
  9229  		{"DirEntry", Type, 16, ""},
  9230  		{"DirFS", Func, 16, "func(dir string) fs.FS"},
  9231  		{"Environ", Func, 0, "func() []string"},
  9232  		{"ErrClosed", Var, 8, ""},
  9233  		{"ErrDeadlineExceeded", Var, 15, ""},
  9234  		{"ErrExist", Var, 0, ""},
  9235  		{"ErrInvalid", Var, 0, ""},
  9236  		{"ErrNoDeadline", Var, 10, ""},
  9237  		{"ErrNotExist", Var, 0, ""},
  9238  		{"ErrPermission", Var, 0, ""},
  9239  		{"ErrProcessDone", Var, 16, ""},
  9240  		{"Executable", Func, 8, "func() (string, error)"},
  9241  		{"Exit", Func, 0, "func(code int)"},
  9242  		{"Expand", Func, 0, "func(s string, mapping func(string) string) string"},
  9243  		{"ExpandEnv", Func, 0, "func(s string) string"},
  9244  		{"File", Type, 0, ""},
  9245  		{"FileInfo", Type, 0, ""},
  9246  		{"FileMode", Type, 0, ""},
  9247  		{"FindProcess", Func, 0, "func(pid int) (*Process, error)"},
  9248  		{"Getegid", Func, 0, "func() int"},
  9249  		{"Getenv", Func, 0, "func(key string) string"},
  9250  		{"Geteuid", Func, 0, "func() int"},
  9251  		{"Getgid", Func, 0, "func() int"},
  9252  		{"Getgroups", Func, 0, "func() ([]int, error)"},
  9253  		{"Getpagesize", Func, 0, "func() int"},
  9254  		{"Getpid", Func, 0, "func() int"},
  9255  		{"Getppid", Func, 0, "func() int"},
  9256  		{"Getuid", Func, 0, "func() int"},
  9257  		{"Getwd", Func, 0, "func() (dir string, err error)"},
  9258  		{"Hostname", Func, 0, "func() (name string, err error)"},
  9259  		{"Interrupt", Var, 0, ""},
  9260  		{"IsExist", Func, 0, "func(err error) bool"},
  9261  		{"IsNotExist", Func, 0, "func(err error) bool"},
  9262  		{"IsPathSeparator", Func, 0, "func(c uint8) bool"},
  9263  		{"IsPermission", Func, 0, "func(err error) bool"},
  9264  		{"IsTimeout", Func, 10, "func(err error) bool"},
  9265  		{"Kill", Var, 0, ""},
  9266  		{"Lchown", Func, 0, "func(name string, uid int, gid int) error"},
  9267  		{"Link", Func, 0, "func(oldname string, newname string) error"},
  9268  		{"LinkError", Type, 0, ""},
  9269  		{"LinkError.Err", Field, 0, ""},
  9270  		{"LinkError.New", Field, 0, ""},
  9271  		{"LinkError.Old", Field, 0, ""},
  9272  		{"LinkError.Op", Field, 0, ""},
  9273  		{"LookupEnv", Func, 5, "func(key string) (string, bool)"},
  9274  		{"Lstat", Func, 0, "func(name string) (FileInfo, error)"},
  9275  		{"Mkdir", Func, 0, "func(name string, perm FileMode) error"},
  9276  		{"MkdirAll", Func, 0, "func(path string, perm FileMode) error"},
  9277  		{"MkdirTemp", Func, 16, "func(dir string, pattern string) (string, error)"},
  9278  		{"ModeAppend", Const, 0, ""},
  9279  		{"ModeCharDevice", Const, 0, ""},
  9280  		{"ModeDevice", Const, 0, ""},
  9281  		{"ModeDir", Const, 0, ""},
  9282  		{"ModeExclusive", Const, 0, ""},
  9283  		{"ModeIrregular", Const, 11, ""},
  9284  		{"ModeNamedPipe", Const, 0, ""},
  9285  		{"ModePerm", Const, 0, ""},
  9286  		{"ModeSetgid", Const, 0, ""},
  9287  		{"ModeSetuid", Const, 0, ""},
  9288  		{"ModeSocket", Const, 0, ""},
  9289  		{"ModeSticky", Const, 0, ""},
  9290  		{"ModeSymlink", Const, 0, ""},
  9291  		{"ModeTemporary", Const, 0, ""},
  9292  		{"ModeType", Const, 0, ""},
  9293  		{"NewFile", Func, 0, "func(fd uintptr, name string) *File"},
  9294  		{"NewSyscallError", Func, 0, "func(syscall string, err error) error"},
  9295  		{"O_APPEND", Const, 0, ""},
  9296  		{"O_CREATE", Const, 0, ""},
  9297  		{"O_EXCL", Const, 0, ""},
  9298  		{"O_RDONLY", Const, 0, ""},
  9299  		{"O_RDWR", Const, 0, ""},
  9300  		{"O_SYNC", Const, 0, ""},
  9301  		{"O_TRUNC", Const, 0, ""},
  9302  		{"O_WRONLY", Const, 0, ""},
  9303  		{"Open", Func, 0, "func(name string) (*File, error)"},
  9304  		{"OpenFile", Func, 0, "func(name string, flag int, perm FileMode) (*File, error)"},
  9305  		{"OpenInRoot", Func, 24, "func(dir string, name string) (*File, error)"},
  9306  		{"OpenRoot", Func, 24, "func(name string) (*Root, error)"},
  9307  		{"PathError", Type, 0, ""},
  9308  		{"PathError.Err", Field, 0, ""},
  9309  		{"PathError.Op", Field, 0, ""},
  9310  		{"PathError.Path", Field, 0, ""},
  9311  		{"PathListSeparator", Const, 0, ""},
  9312  		{"PathSeparator", Const, 0, ""},
  9313  		{"Pipe", Func, 0, "func() (r *File, w *File, err error)"},
  9314  		{"ProcAttr", Type, 0, ""},
  9315  		{"ProcAttr.Dir", Field, 0, ""},
  9316  		{"ProcAttr.Env", Field, 0, ""},
  9317  		{"ProcAttr.Files", Field, 0, ""},
  9318  		{"ProcAttr.Sys", Field, 0, ""},
  9319  		{"Process", Type, 0, ""},
  9320  		{"Process.Pid", Field, 0, ""},
  9321  		{"ProcessState", Type, 0, ""},
  9322  		{"ReadDir", Func, 16, "func(name string) ([]DirEntry, error)"},
  9323  		{"ReadFile", Func, 16, "func(name string) ([]byte, error)"},
  9324  		{"Readlink", Func, 0, "func(name string) (string, error)"},
  9325  		{"Remove", Func, 0, "func(name string) error"},
  9326  		{"RemoveAll", Func, 0, "func(path string) error"},
  9327  		{"Rename", Func, 0, "func(oldpath string, newpath string) error"},
  9328  		{"Root", Type, 24, ""},
  9329  		{"SEEK_CUR", Const, 0, ""},
  9330  		{"SEEK_END", Const, 0, ""},
  9331  		{"SEEK_SET", Const, 0, ""},
  9332  		{"SameFile", Func, 0, "func(fi1 FileInfo, fi2 FileInfo) bool"},
  9333  		{"Setenv", Func, 0, "func(key string, value string) error"},
  9334  		{"Signal", Type, 0, ""},
  9335  		{"StartProcess", Func, 0, "func(name string, argv []string, attr *ProcAttr) (*Process, error)"},
  9336  		{"Stat", Func, 0, "func(name string) (FileInfo, error)"},
  9337  		{"Stderr", Var, 0, ""},
  9338  		{"Stdin", Var, 0, ""},
  9339  		{"Stdout", Var, 0, ""},
  9340  		{"Symlink", Func, 0, "func(oldname string, newname string) error"},
  9341  		{"SyscallError", Type, 0, ""},
  9342  		{"SyscallError.Err", Field, 0, ""},
  9343  		{"SyscallError.Syscall", Field, 0, ""},
  9344  		{"TempDir", Func, 0, "func() string"},
  9345  		{"Truncate", Func, 0, "func(name string, size int64) error"},
  9346  		{"Unsetenv", Func, 4, "func(key string) error"},
  9347  		{"UserCacheDir", Func, 11, "func() (string, error)"},
  9348  		{"UserConfigDir", Func, 13, "func() (string, error)"},
  9349  		{"UserHomeDir", Func, 12, "func() (string, error)"},
  9350  		{"WriteFile", Func, 16, "func(name string, data []byte, perm FileMode) error"},
  9351  	},
  9352  	"os/exec": {
  9353  		{"(*Cmd).CombinedOutput", Method, 0, ""},
  9354  		{"(*Cmd).Environ", Method, 19, ""},
  9355  		{"(*Cmd).Output", Method, 0, ""},
  9356  		{"(*Cmd).Run", Method, 0, ""},
  9357  		{"(*Cmd).Start", Method, 0, ""},
  9358  		{"(*Cmd).StderrPipe", Method, 0, ""},
  9359  		{"(*Cmd).StdinPipe", Method, 0, ""},
  9360  		{"(*Cmd).StdoutPipe", Method, 0, ""},
  9361  		{"(*Cmd).String", Method, 13, ""},
  9362  		{"(*Cmd).Wait", Method, 0, ""},
  9363  		{"(*Error).Error", Method, 0, ""},
  9364  		{"(*Error).Unwrap", Method, 13, ""},
  9365  		{"(*ExitError).Error", Method, 0, ""},
  9366  		{"(ExitError).ExitCode", Method, 12, ""},
  9367  		{"(ExitError).Exited", Method, 0, ""},
  9368  		{"(ExitError).Pid", Method, 0, ""},
  9369  		{"(ExitError).String", Method, 0, ""},
  9370  		{"(ExitError).Success", Method, 0, ""},
  9371  		{"(ExitError).Sys", Method, 0, ""},
  9372  		{"(ExitError).SysUsage", Method, 0, ""},
  9373  		{"(ExitError).SystemTime", Method, 0, ""},
  9374  		{"(ExitError).UserTime", Method, 0, ""},
  9375  		{"Cmd", Type, 0, ""},
  9376  		{"Cmd.Args", Field, 0, ""},
  9377  		{"Cmd.Cancel", Field, 20, ""},
  9378  		{"Cmd.Dir", Field, 0, ""},
  9379  		{"Cmd.Env", Field, 0, ""},
  9380  		{"Cmd.Err", Field, 19, ""},
  9381  		{"Cmd.ExtraFiles", Field, 0, ""},
  9382  		{"Cmd.Path", Field, 0, ""},
  9383  		{"Cmd.Process", Field, 0, ""},
  9384  		{"Cmd.ProcessState", Field, 0, ""},
  9385  		{"Cmd.Stderr", Field, 0, ""},
  9386  		{"Cmd.Stdin", Field, 0, ""},
  9387  		{"Cmd.Stdout", Field, 0, ""},
  9388  		{"Cmd.SysProcAttr", Field, 0, ""},
  9389  		{"Cmd.WaitDelay", Field, 20, ""},
  9390  		{"Command", Func, 0, "func(name string, arg ...string) *Cmd"},
  9391  		{"CommandContext", Func, 7, "func(ctx context.Context, name string, arg ...string) *Cmd"},
  9392  		{"ErrDot", Var, 19, ""},
  9393  		{"ErrNotFound", Var, 0, ""},
  9394  		{"ErrWaitDelay", Var, 20, ""},
  9395  		{"Error", Type, 0, ""},
  9396  		{"Error.Err", Field, 0, ""},
  9397  		{"Error.Name", Field, 0, ""},
  9398  		{"ExitError", Type, 0, ""},
  9399  		{"ExitError.ProcessState", Field, 0, ""},
  9400  		{"ExitError.Stderr", Field, 6, ""},
  9401  		{"LookPath", Func, 0, "func(file string) (string, error)"},
  9402  	},
  9403  	"os/signal": {
  9404  		{"Ignore", Func, 5, "func(sig ...os.Signal)"},
  9405  		{"Ignored", Func, 11, "func(sig os.Signal) bool"},
  9406  		{"Notify", Func, 0, "func(c chan<- os.Signal, sig ...os.Signal)"},
  9407  		{"NotifyContext", Func, 16, "func(parent context.Context, signals ...os.Signal) (ctx context.Context, stop context.CancelFunc)"},
  9408  		{"Reset", Func, 5, "func(sig ...os.Signal)"},
  9409  		{"Stop", Func, 1, "func(c chan<- os.Signal)"},
  9410  	},
  9411  	"os/user": {
  9412  		{"(*User).GroupIds", Method, 7, ""},
  9413  		{"(UnknownGroupError).Error", Method, 7, ""},
  9414  		{"(UnknownGroupIdError).Error", Method, 7, ""},
  9415  		{"(UnknownUserError).Error", Method, 0, ""},
  9416  		{"(UnknownUserIdError).Error", Method, 0, ""},
  9417  		{"Current", Func, 0, "func() (*User, error)"},
  9418  		{"Group", Type, 7, ""},
  9419  		{"Group.Gid", Field, 7, ""},
  9420  		{"Group.Name", Field, 7, ""},
  9421  		{"Lookup", Func, 0, "func(username string) (*User, error)"},
  9422  		{"LookupGroup", Func, 7, "func(name string) (*Group, error)"},
  9423  		{"LookupGroupId", Func, 7, "func(gid string) (*Group, error)"},
  9424  		{"LookupId", Func, 0, "func(uid string) (*User, error)"},
  9425  		{"UnknownGroupError", Type, 7, ""},
  9426  		{"UnknownGroupIdError", Type, 7, ""},
  9427  		{"UnknownUserError", Type, 0, ""},
  9428  		{"UnknownUserIdError", Type, 0, ""},
  9429  		{"User", Type, 0, ""},
  9430  		{"User.Gid", Field, 0, ""},
  9431  		{"User.HomeDir", Field, 0, ""},
  9432  		{"User.Name", Field, 0, ""},
  9433  		{"User.Uid", Field, 0, ""},
  9434  		{"User.Username", Field, 0, ""},
  9435  	},
  9436  	"path": {
  9437  		{"Base", Func, 0, "func(path string) string"},
  9438  		{"Clean", Func, 0, "func(path string) string"},
  9439  		{"Dir", Func, 0, "func(path string) string"},
  9440  		{"ErrBadPattern", Var, 0, ""},
  9441  		{"Ext", Func, 0, "func(path string) string"},
  9442  		{"IsAbs", Func, 0, "func(path string) bool"},
  9443  		{"Join", Func, 0, "func(elem ...string) string"},
  9444  		{"Match", Func, 0, "func(pattern string, name string) (matched bool, err error)"},
  9445  		{"Split", Func, 0, "func(path string) (dir string, file string)"},
  9446  	},
  9447  	"path/filepath": {
  9448  		{"Abs", Func, 0, "func(path string) (string, error)"},
  9449  		{"Base", Func, 0, "func(path string) string"},
  9450  		{"Clean", Func, 0, "func(path string) string"},
  9451  		{"Dir", Func, 0, "func(path string) string"},
  9452  		{"ErrBadPattern", Var, 0, ""},
  9453  		{"EvalSymlinks", Func, 0, "func(path string) (string, error)"},
  9454  		{"Ext", Func, 0, "func(path string) string"},
  9455  		{"FromSlash", Func, 0, "func(path string) string"},
  9456  		{"Glob", Func, 0, "func(pattern string) (matches []string, err error)"},
  9457  		{"HasPrefix", Func, 0, "func(p string, prefix string) bool"},
  9458  		{"IsAbs", Func, 0, "func(path string) bool"},
  9459  		{"IsLocal", Func, 20, "func(path string) bool"},
  9460  		{"Join", Func, 0, "func(elem ...string) string"},
  9461  		{"ListSeparator", Const, 0, ""},
  9462  		{"Localize", Func, 23, "func(path string) (string, error)"},
  9463  		{"Match", Func, 0, "func(pattern string, name string) (matched bool, err error)"},
  9464  		{"Rel", Func, 0, "func(basepath string, targpath string) (string, error)"},
  9465  		{"Separator", Const, 0, ""},
  9466  		{"SkipAll", Var, 20, ""},
  9467  		{"SkipDir", Var, 0, ""},
  9468  		{"Split", Func, 0, "func(path string) (dir string, file string)"},
  9469  		{"SplitList", Func, 0, "func(path string) []string"},
  9470  		{"ToSlash", Func, 0, "func(path string) string"},
  9471  		{"VolumeName", Func, 0, "func(path string) string"},
  9472  		{"Walk", Func, 0, "func(root string, fn WalkFunc) error"},
  9473  		{"WalkDir", Func, 16, "func(root string, fn fs.WalkDirFunc) error"},
  9474  		{"WalkFunc", Type, 0, ""},
  9475  	},
  9476  	"plugin": {
  9477  		{"(*Plugin).Lookup", Method, 8, ""},
  9478  		{"Open", Func, 8, "func(path string) (*Plugin, error)"},
  9479  		{"Plugin", Type, 8, ""},
  9480  		{"Symbol", Type, 8, ""},
  9481  	},
  9482  	"reflect": {
  9483  		{"(*MapIter).Key", Method, 12, ""},
  9484  		{"(*MapIter).Next", Method, 12, ""},
  9485  		{"(*MapIter).Reset", Method, 18, ""},
  9486  		{"(*MapIter).Value", Method, 12, ""},
  9487  		{"(*ValueError).Error", Method, 0, ""},
  9488  		{"(ChanDir).String", Method, 0, ""},
  9489  		{"(Kind).String", Method, 0, ""},
  9490  		{"(Method).IsExported", Method, 17, ""},
  9491  		{"(StructField).IsExported", Method, 17, ""},
  9492  		{"(StructTag).Get", Method, 0, ""},
  9493  		{"(StructTag).Lookup", Method, 7, ""},
  9494  		{"(Value).Addr", Method, 0, ""},
  9495  		{"(Value).Bool", Method, 0, ""},
  9496  		{"(Value).Bytes", Method, 0, ""},
  9497  		{"(Value).Call", Method, 0, ""},
  9498  		{"(Value).CallSlice", Method, 0, ""},
  9499  		{"(Value).CanAddr", Method, 0, ""},
  9500  		{"(Value).CanComplex", Method, 18, ""},
  9501  		{"(Value).CanConvert", Method, 17, ""},
  9502  		{"(Value).CanFloat", Method, 18, ""},
  9503  		{"(Value).CanInt", Method, 18, ""},
  9504  		{"(Value).CanInterface", Method, 0, ""},
  9505  		{"(Value).CanSet", Method, 0, ""},
  9506  		{"(Value).CanUint", Method, 18, ""},
  9507  		{"(Value).Cap", Method, 0, ""},
  9508  		{"(Value).Clear", Method, 21, ""},
  9509  		{"(Value).Close", Method, 0, ""},
  9510  		{"(Value).Comparable", Method, 20, ""},
  9511  		{"(Value).Complex", Method, 0, ""},
  9512  		{"(Value).Convert", Method, 1, ""},
  9513  		{"(Value).Elem", Method, 0, ""},
  9514  		{"(Value).Equal", Method, 20, ""},
  9515  		{"(Value).Field", Method, 0, ""},
  9516  		{"(Value).FieldByIndex", Method, 0, ""},
  9517  		{"(Value).FieldByIndexErr", Method, 18, ""},
  9518  		{"(Value).FieldByName", Method, 0, ""},
  9519  		{"(Value).FieldByNameFunc", Method, 0, ""},
  9520  		{"(Value).Float", Method, 0, ""},
  9521  		{"(Value).Grow", Method, 20, ""},
  9522  		{"(Value).Index", Method, 0, ""},
  9523  		{"(Value).Int", Method, 0, ""},
  9524  		{"(Value).Interface", Method, 0, ""},
  9525  		{"(Value).InterfaceData", Method, 0, ""},
  9526  		{"(Value).IsNil", Method, 0, ""},
  9527  		{"(Value).IsValid", Method, 0, ""},
  9528  		{"(Value).IsZero", Method, 13, ""},
  9529  		{"(Value).Kind", Method, 0, ""},
  9530  		{"(Value).Len", Method, 0, ""},
  9531  		{"(Value).MapIndex", Method, 0, ""},
  9532  		{"(Value).MapKeys", Method, 0, ""},
  9533  		{"(Value).MapRange", Method, 12, ""},
  9534  		{"(Value).Method", Method, 0, ""},
  9535  		{"(Value).MethodByName", Method, 0, ""},
  9536  		{"(Value).NumField", Method, 0, ""},
  9537  		{"(Value).NumMethod", Method, 0, ""},
  9538  		{"(Value).OverflowComplex", Method, 0, ""},
  9539  		{"(Value).OverflowFloat", Method, 0, ""},
  9540  		{"(Value).OverflowInt", Method, 0, ""},
  9541  		{"(Value).OverflowUint", Method, 0, ""},
  9542  		{"(Value).Pointer", Method, 0, ""},
  9543  		{"(Value).Recv", Method, 0, ""},
  9544  		{"(Value).Send", Method, 0, ""},
  9545  		{"(Value).Seq", Method, 23, ""},
  9546  		{"(Value).Seq2", Method, 23, ""},
  9547  		{"(Value).Set", Method, 0, ""},
  9548  		{"(Value).SetBool", Method, 0, ""},
  9549  		{"(Value).SetBytes", Method, 0, ""},
  9550  		{"(Value).SetCap", Method, 2, ""},
  9551  		{"(Value).SetComplex", Method, 0, ""},
  9552  		{"(Value).SetFloat", Method, 0, ""},
  9553  		{"(Value).SetInt", Method, 0, ""},
  9554  		{"(Value).SetIterKey", Method, 18, ""},
  9555  		{"(Value).SetIterValue", Method, 18, ""},
  9556  		{"(Value).SetLen", Method, 0, ""},
  9557  		{"(Value).SetMapIndex", Method, 0, ""},
  9558  		{"(Value).SetPointer", Method, 0, ""},
  9559  		{"(Value).SetString", Method, 0, ""},
  9560  		{"(Value).SetUint", Method, 0, ""},
  9561  		{"(Value).SetZero", Method, 20, ""},
  9562  		{"(Value).Slice", Method, 0, ""},
  9563  		{"(Value).Slice3", Method, 2, ""},
  9564  		{"(Value).String", Method, 0, ""},
  9565  		{"(Value).TryRecv", Method, 0, ""},
  9566  		{"(Value).TrySend", Method, 0, ""},
  9567  		{"(Value).Type", Method, 0, ""},
  9568  		{"(Value).Uint", Method, 0, ""},
  9569  		{"(Value).UnsafeAddr", Method, 0, ""},
  9570  		{"(Value).UnsafePointer", Method, 18, ""},
  9571  		{"Append", Func, 0, "func(s Value, x ...Value) Value"},
  9572  		{"AppendSlice", Func, 0, "func(s Value, t Value) Value"},
  9573  		{"Array", Const, 0, ""},
  9574  		{"ArrayOf", Func, 5, "func(length int, elem Type) Type"},
  9575  		{"Bool", Const, 0, ""},
  9576  		{"BothDir", Const, 0, ""},
  9577  		{"Chan", Const, 0, ""},
  9578  		{"ChanDir", Type, 0, ""},
  9579  		{"ChanOf", Func, 1, "func(dir ChanDir, t Type) Type"},
  9580  		{"Complex128", Const, 0, ""},
  9581  		{"Complex64", Const, 0, ""},
  9582  		{"Copy", Func, 0, "func(dst Value, src Value) int"},
  9583  		{"DeepEqual", Func, 0, "func(x any, y any) bool"},
  9584  		{"Float32", Const, 0, ""},
  9585  		{"Float64", Const, 0, ""},
  9586  		{"Func", Const, 0, ""},
  9587  		{"FuncOf", Func, 5, "func(in []Type, out []Type, variadic bool) Type"},
  9588  		{"Indirect", Func, 0, "func(v Value) Value"},
  9589  		{"Int", Const, 0, ""},
  9590  		{"Int16", Const, 0, ""},
  9591  		{"Int32", Const, 0, ""},
  9592  		{"Int64", Const, 0, ""},
  9593  		{"Int8", Const, 0, ""},
  9594  		{"Interface", Const, 0, ""},
  9595  		{"Invalid", Const, 0, ""},
  9596  		{"Kind", Type, 0, ""},
  9597  		{"MakeChan", Func, 0, "func(typ Type, buffer int) Value"},
  9598  		{"MakeFunc", Func, 1, "func(typ Type, fn func(args []Value) (results []Value)) Value"},
  9599  		{"MakeMap", Func, 0, "func(typ Type) Value"},
  9600  		{"MakeMapWithSize", Func, 9, "func(typ Type, n int) Value"},
  9601  		{"MakeSlice", Func, 0, "func(typ Type, len int, cap int) Value"},
  9602  		{"Map", Const, 0, ""},
  9603  		{"MapIter", Type, 12, ""},
  9604  		{"MapOf", Func, 1, "func(key Type, elem Type) Type"},
  9605  		{"Method", Type, 0, ""},
  9606  		{"Method.Func", Field, 0, ""},
  9607  		{"Method.Index", Field, 0, ""},
  9608  		{"Method.Name", Field, 0, ""},
  9609  		{"Method.PkgPath", Field, 0, ""},
  9610  		{"Method.Type", Field, 0, ""},
  9611  		{"New", Func, 0, "func(typ Type) Value"},
  9612  		{"NewAt", Func, 0, "func(typ Type, p unsafe.Pointer) Value"},
  9613  		{"Pointer", Const, 18, ""},
  9614  		{"PointerTo", Func, 18, "func(t Type) Type"},
  9615  		{"Ptr", Const, 0, ""},
  9616  		{"PtrTo", Func, 0, "func(t Type) Type"},
  9617  		{"RecvDir", Const, 0, ""},
  9618  		{"Select", Func, 1, "func(cases []SelectCase) (chosen int, recv Value, recvOK bool)"},
  9619  		{"SelectCase", Type, 1, ""},
  9620  		{"SelectCase.Chan", Field, 1, ""},
  9621  		{"SelectCase.Dir", Field, 1, ""},
  9622  		{"SelectCase.Send", Field, 1, ""},
  9623  		{"SelectDefault", Const, 1, ""},
  9624  		{"SelectDir", Type, 1, ""},
  9625  		{"SelectRecv", Const, 1, ""},
  9626  		{"SelectSend", Const, 1, ""},
  9627  		{"SendDir", Const, 0, ""},
  9628  		{"Slice", Const, 0, ""},
  9629  		{"SliceAt", Func, 23, "func(typ Type, p unsafe.Pointer, n int) Value"},
  9630  		{"SliceHeader", Type, 0, ""},
  9631  		{"SliceHeader.Cap", Field, 0, ""},
  9632  		{"SliceHeader.Data", Field, 0, ""},
  9633  		{"SliceHeader.Len", Field, 0, ""},
  9634  		{"SliceOf", Func, 1, "func(t Type) Type"},
  9635  		{"String", Const, 0, ""},
  9636  		{"StringHeader", Type, 0, ""},
  9637  		{"StringHeader.Data", Field, 0, ""},
  9638  		{"StringHeader.Len", Field, 0, ""},
  9639  		{"Struct", Const, 0, ""},
  9640  		{"StructField", Type, 0, ""},
  9641  		{"StructField.Anonymous", Field, 0, ""},
  9642  		{"StructField.Index", Field, 0, ""},
  9643  		{"StructField.Name", Field, 0, ""},
  9644  		{"StructField.Offset", Field, 0, ""},
  9645  		{"StructField.PkgPath", Field, 0, ""},
  9646  		{"StructField.Tag", Field, 0, ""},
  9647  		{"StructField.Type", Field, 0, ""},
  9648  		{"StructOf", Func, 7, "func(fields []StructField) Type"},
  9649  		{"StructTag", Type, 0, ""},
  9650  		{"Swapper", Func, 8, "func(slice any) func(i int, j int)"},
  9651  		{"Type", Type, 0, ""},
  9652  		{"TypeAssert", Func, 25, "func[T any](v Value) (T, bool)"},
  9653  		{"TypeFor", Func, 22, "func[T any]() Type"},
  9654  		{"TypeOf", Func, 0, "func(i any) Type"},
  9655  		{"Uint", Const, 0, ""},
  9656  		{"Uint16", Const, 0, ""},
  9657  		{"Uint32", Const, 0, ""},
  9658  		{"Uint64", Const, 0, ""},
  9659  		{"Uint8", Const, 0, ""},
  9660  		{"Uintptr", Const, 0, ""},
  9661  		{"UnsafePointer", Const, 0, ""},
  9662  		{"Value", Type, 0, ""},
  9663  		{"ValueError", Type, 0, ""},
  9664  		{"ValueError.Kind", Field, 0, ""},
  9665  		{"ValueError.Method", Field, 0, ""},
  9666  		{"ValueOf", Func, 0, "func(i any) Value"},
  9667  		{"VisibleFields", Func, 17, "func(t Type) []StructField"},
  9668  		{"Zero", Func, 0, "func(typ Type) Value"},
  9669  	},
  9670  	"regexp": {
  9671  		{"(*Regexp).AppendText", Method, 24, ""},
  9672  		{"(*Regexp).Copy", Method, 6, ""},
  9673  		{"(*Regexp).Expand", Method, 0, ""},
  9674  		{"(*Regexp).ExpandString", Method, 0, ""},
  9675  		{"(*Regexp).Find", Method, 0, ""},
  9676  		{"(*Regexp).FindAll", Method, 0, ""},
  9677  		{"(*Regexp).FindAllIndex", Method, 0, ""},
  9678  		{"(*Regexp).FindAllString", Method, 0, ""},
  9679  		{"(*Regexp).FindAllStringIndex", Method, 0, ""},
  9680  		{"(*Regexp).FindAllStringSubmatch", Method, 0, ""},
  9681  		{"(*Regexp).FindAllStringSubmatchIndex", Method, 0, ""},
  9682  		{"(*Regexp).FindAllSubmatch", Method, 0, ""},
  9683  		{"(*Regexp).FindAllSubmatchIndex", Method, 0, ""},
  9684  		{"(*Regexp).FindIndex", Method, 0, ""},
  9685  		{"(*Regexp).FindReaderIndex", Method, 0, ""},
  9686  		{"(*Regexp).FindReaderSubmatchIndex", Method, 0, ""},
  9687  		{"(*Regexp).FindString", Method, 0, ""},
  9688  		{"(*Regexp).FindStringIndex", Method, 0, ""},
  9689  		{"(*Regexp).FindStringSubmatch", Method, 0, ""},
  9690  		{"(*Regexp).FindStringSubmatchIndex", Method, 0, ""},
  9691  		{"(*Regexp).FindSubmatch", Method, 0, ""},
  9692  		{"(*Regexp).FindSubmatchIndex", Method, 0, ""},
  9693  		{"(*Regexp).LiteralPrefix", Method, 0, ""},
  9694  		{"(*Regexp).Longest", Method, 1, ""},
  9695  		{"(*Regexp).MarshalText", Method, 21, ""},
  9696  		{"(*Regexp).Match", Method, 0, ""},
  9697  		{"(*Regexp).MatchReader", Method, 0, ""},
  9698  		{"(*Regexp).MatchString", Method, 0, ""},
  9699  		{"(*Regexp).NumSubexp", Method, 0, ""},
  9700  		{"(*Regexp).ReplaceAll", Method, 0, ""},
  9701  		{"(*Regexp).ReplaceAllFunc", Method, 0, ""},
  9702  		{"(*Regexp).ReplaceAllLiteral", Method, 0, ""},
  9703  		{"(*Regexp).ReplaceAllLiteralString", Method, 0, ""},
  9704  		{"(*Regexp).ReplaceAllString", Method, 0, ""},
  9705  		{"(*Regexp).ReplaceAllStringFunc", Method, 0, ""},
  9706  		{"(*Regexp).Split", Method, 1, ""},
  9707  		{"(*Regexp).String", Method, 0, ""},
  9708  		{"(*Regexp).SubexpIndex", Method, 15, ""},
  9709  		{"(*Regexp).SubexpNames", Method, 0, ""},
  9710  		{"(*Regexp).UnmarshalText", Method, 21, ""},
  9711  		{"Compile", Func, 0, "func(expr string) (*Regexp, error)"},
  9712  		{"CompilePOSIX", Func, 0, "func(expr string) (*Regexp, error)"},
  9713  		{"Match", Func, 0, "func(pattern string, b []byte) (matched bool, err error)"},
  9714  		{"MatchReader", Func, 0, "func(pattern string, r io.RuneReader) (matched bool, err error)"},
  9715  		{"MatchString", Func, 0, "func(pattern string, s string) (matched bool, err error)"},
  9716  		{"MustCompile", Func, 0, "func(str string) *Regexp"},
  9717  		{"MustCompilePOSIX", Func, 0, "func(str string) *Regexp"},
  9718  		{"QuoteMeta", Func, 0, "func(s string) string"},
  9719  		{"Regexp", Type, 0, ""},
  9720  	},
  9721  	"regexp/syntax": {
  9722  		{"(*Error).Error", Method, 0, ""},
  9723  		{"(*Inst).MatchEmptyWidth", Method, 0, ""},
  9724  		{"(*Inst).MatchRune", Method, 0, ""},
  9725  		{"(*Inst).MatchRunePos", Method, 3, ""},
  9726  		{"(*Inst).String", Method, 0, ""},
  9727  		{"(*Prog).Prefix", Method, 0, ""},
  9728  		{"(*Prog).StartCond", Method, 0, ""},
  9729  		{"(*Prog).String", Method, 0, ""},
  9730  		{"(*Regexp).CapNames", Method, 0, ""},
  9731  		{"(*Regexp).Equal", Method, 0, ""},
  9732  		{"(*Regexp).MaxCap", Method, 0, ""},
  9733  		{"(*Regexp).Simplify", Method, 0, ""},
  9734  		{"(*Regexp).String", Method, 0, ""},
  9735  		{"(ErrorCode).String", Method, 0, ""},
  9736  		{"(InstOp).String", Method, 3, ""},
  9737  		{"(Op).String", Method, 11, ""},
  9738  		{"ClassNL", Const, 0, ""},
  9739  		{"Compile", Func, 0, "func(re *Regexp) (*Prog, error)"},
  9740  		{"DotNL", Const, 0, ""},
  9741  		{"EmptyBeginLine", Const, 0, ""},
  9742  		{"EmptyBeginText", Const, 0, ""},
  9743  		{"EmptyEndLine", Const, 0, ""},
  9744  		{"EmptyEndText", Const, 0, ""},
  9745  		{"EmptyNoWordBoundary", Const, 0, ""},
  9746  		{"EmptyOp", Type, 0, ""},
  9747  		{"EmptyOpContext", Func, 0, "func(r1 rune, r2 rune) EmptyOp"},
  9748  		{"EmptyWordBoundary", Const, 0, ""},
  9749  		{"ErrInternalError", Const, 0, ""},
  9750  		{"ErrInvalidCharClass", Const, 0, ""},
  9751  		{"ErrInvalidCharRange", Const, 0, ""},
  9752  		{"ErrInvalidEscape", Const, 0, ""},
  9753  		{"ErrInvalidNamedCapture", Const, 0, ""},
  9754  		{"ErrInvalidPerlOp", Const, 0, ""},
  9755  		{"ErrInvalidRepeatOp", Const, 0, ""},
  9756  		{"ErrInvalidRepeatSize", Const, 0, ""},
  9757  		{"ErrInvalidUTF8", Const, 0, ""},
  9758  		{"ErrLarge", Const, 20, ""},
  9759  		{"ErrMissingBracket", Const, 0, ""},
  9760  		{"ErrMissingParen", Const, 0, ""},
  9761  		{"ErrMissingRepeatArgument", Const, 0, ""},
  9762  		{"ErrNestingDepth", Const, 19, ""},
  9763  		{"ErrTrailingBackslash", Const, 0, ""},
  9764  		{"ErrUnexpectedParen", Const, 1, ""},
  9765  		{"Error", Type, 0, ""},
  9766  		{"Error.Code", Field, 0, ""},
  9767  		{"Error.Expr", Field, 0, ""},
  9768  		{"ErrorCode", Type, 0, ""},
  9769  		{"Flags", Type, 0, ""},
  9770  		{"FoldCase", Const, 0, ""},
  9771  		{"Inst", Type, 0, ""},
  9772  		{"Inst.Arg", Field, 0, ""},
  9773  		{"Inst.Op", Field, 0, ""},
  9774  		{"Inst.Out", Field, 0, ""},
  9775  		{"Inst.Rune", Field, 0, ""},
  9776  		{"InstAlt", Const, 0, ""},
  9777  		{"InstAltMatch", Const, 0, ""},
  9778  		{"InstCapture", Const, 0, ""},
  9779  		{"InstEmptyWidth", Const, 0, ""},
  9780  		{"InstFail", Const, 0, ""},
  9781  		{"InstMatch", Const, 0, ""},
  9782  		{"InstNop", Const, 0, ""},
  9783  		{"InstOp", Type, 0, ""},
  9784  		{"InstRune", Const, 0, ""},
  9785  		{"InstRune1", Const, 0, ""},
  9786  		{"InstRuneAny", Const, 0, ""},
  9787  		{"InstRuneAnyNotNL", Const, 0, ""},
  9788  		{"IsWordChar", Func, 0, "func(r rune) bool"},
  9789  		{"Literal", Const, 0, ""},
  9790  		{"MatchNL", Const, 0, ""},
  9791  		{"NonGreedy", Const, 0, ""},
  9792  		{"OneLine", Const, 0, ""},
  9793  		{"Op", Type, 0, ""},
  9794  		{"OpAlternate", Const, 0, ""},
  9795  		{"OpAnyChar", Const, 0, ""},
  9796  		{"OpAnyCharNotNL", Const, 0, ""},
  9797  		{"OpBeginLine", Const, 0, ""},
  9798  		{"OpBeginText", Const, 0, ""},
  9799  		{"OpCapture", Const, 0, ""},
  9800  		{"OpCharClass", Const, 0, ""},
  9801  		{"OpConcat", Const, 0, ""},
  9802  		{"OpEmptyMatch", Const, 0, ""},
  9803  		{"OpEndLine", Const, 0, ""},
  9804  		{"OpEndText", Const, 0, ""},
  9805  		{"OpLiteral", Const, 0, ""},
  9806  		{"OpNoMatch", Const, 0, ""},
  9807  		{"OpNoWordBoundary", Const, 0, ""},
  9808  		{"OpPlus", Const, 0, ""},
  9809  		{"OpQuest", Const, 0, ""},
  9810  		{"OpRepeat", Const, 0, ""},
  9811  		{"OpStar", Const, 0, ""},
  9812  		{"OpWordBoundary", Const, 0, ""},
  9813  		{"POSIX", Const, 0, ""},
  9814  		{"Parse", Func, 0, "func(s string, flags Flags) (*Regexp, error)"},
  9815  		{"Perl", Const, 0, ""},
  9816  		{"PerlX", Const, 0, ""},
  9817  		{"Prog", Type, 0, ""},
  9818  		{"Prog.Inst", Field, 0, ""},
  9819  		{"Prog.NumCap", Field, 0, ""},
  9820  		{"Prog.Start", Field, 0, ""},
  9821  		{"Regexp", Type, 0, ""},
  9822  		{"Regexp.Cap", Field, 0, ""},
  9823  		{"Regexp.Flags", Field, 0, ""},
  9824  		{"Regexp.Max", Field, 0, ""},
  9825  		{"Regexp.Min", Field, 0, ""},
  9826  		{"Regexp.Name", Field, 0, ""},
  9827  		{"Regexp.Op", Field, 0, ""},
  9828  		{"Regexp.Rune", Field, 0, ""},
  9829  		{"Regexp.Rune0", Field, 0, ""},
  9830  		{"Regexp.Sub", Field, 0, ""},
  9831  		{"Regexp.Sub0", Field, 0, ""},
  9832  		{"Simple", Const, 0, ""},
  9833  		{"UnicodeGroups", Const, 0, ""},
  9834  		{"WasDollar", Const, 0, ""},
  9835  	},
  9836  	"runtime": {
  9837  		{"(*BlockProfileRecord).Stack", Method, 1, ""},
  9838  		{"(*Frames).Next", Method, 7, ""},
  9839  		{"(*Func).Entry", Method, 0, ""},
  9840  		{"(*Func).FileLine", Method, 0, ""},
  9841  		{"(*Func).Name", Method, 0, ""},
  9842  		{"(*MemProfileRecord).InUseBytes", Method, 0, ""},
  9843  		{"(*MemProfileRecord).InUseObjects", Method, 0, ""},
  9844  		{"(*MemProfileRecord).Stack", Method, 0, ""},
  9845  		{"(*PanicNilError).Error", Method, 21, ""},
  9846  		{"(*PanicNilError).RuntimeError", Method, 21, ""},
  9847  		{"(*Pinner).Pin", Method, 21, ""},
  9848  		{"(*Pinner).Unpin", Method, 21, ""},
  9849  		{"(*StackRecord).Stack", Method, 0, ""},
  9850  		{"(*TypeAssertionError).Error", Method, 0, ""},
  9851  		{"(*TypeAssertionError).RuntimeError", Method, 0, ""},
  9852  		{"(Cleanup).Stop", Method, 24, ""},
  9853  		{"AddCleanup", Func, 24, "func[T, S any](ptr *T, cleanup func(S), arg S) Cleanup"},
  9854  		{"BlockProfile", Func, 1, "func(p []BlockProfileRecord) (n int, ok bool)"},
  9855  		{"BlockProfileRecord", Type, 1, ""},
  9856  		{"BlockProfileRecord.Count", Field, 1, ""},
  9857  		{"BlockProfileRecord.Cycles", Field, 1, ""},
  9858  		{"BlockProfileRecord.StackRecord", Field, 1, ""},
  9859  		{"Breakpoint", Func, 0, "func()"},
  9860  		{"CPUProfile", Func, 0, "func() []byte"},
  9861  		{"Caller", Func, 0, "func(skip int) (pc uintptr, file string, line int, ok bool)"},
  9862  		{"Callers", Func, 0, "func(skip int, pc []uintptr) int"},
  9863  		{"CallersFrames", Func, 7, "func(callers []uintptr) *Frames"},
  9864  		{"Cleanup", Type, 24, ""},
  9865  		{"Compiler", Const, 0, ""},
  9866  		{"Error", Type, 0, ""},
  9867  		{"Frame", Type, 7, ""},
  9868  		{"Frame.Entry", Field, 7, ""},
  9869  		{"Frame.File", Field, 7, ""},
  9870  		{"Frame.Func", Field, 7, ""},
  9871  		{"Frame.Function", Field, 7, ""},
  9872  		{"Frame.Line", Field, 7, ""},
  9873  		{"Frame.PC", Field, 7, ""},
  9874  		{"Frames", Type, 7, ""},
  9875  		{"Func", Type, 0, ""},
  9876  		{"FuncForPC", Func, 0, "func(pc uintptr) *Func"},
  9877  		{"GC", Func, 0, "func()"},
  9878  		{"GOARCH", Const, 0, ""},
  9879  		{"GOMAXPROCS", Func, 0, "func(n int) int"},
  9880  		{"GOOS", Const, 0, ""},
  9881  		{"GOROOT", Func, 0, "func() string"},
  9882  		{"Goexit", Func, 0, "func()"},
  9883  		{"GoroutineProfile", Func, 0, "func(p []StackRecord) (n int, ok bool)"},
  9884  		{"Gosched", Func, 0, "func()"},
  9885  		{"KeepAlive", Func, 7, "func(x any)"},
  9886  		{"LockOSThread", Func, 0, "func()"},
  9887  		{"MemProfile", Func, 0, "func(p []MemProfileRecord, inuseZero bool) (n int, ok bool)"},
  9888  		{"MemProfileRate", Var, 0, ""},
  9889  		{"MemProfileRecord", Type, 0, ""},
  9890  		{"MemProfileRecord.AllocBytes", Field, 0, ""},
  9891  		{"MemProfileRecord.AllocObjects", Field, 0, ""},
  9892  		{"MemProfileRecord.FreeBytes", Field, 0, ""},
  9893  		{"MemProfileRecord.FreeObjects", Field, 0, ""},
  9894  		{"MemProfileRecord.Stack0", Field, 0, ""},
  9895  		{"MemStats", Type, 0, ""},
  9896  		{"MemStats.Alloc", Field, 0, ""},
  9897  		{"MemStats.BuckHashSys", Field, 0, ""},
  9898  		{"MemStats.BySize", Field, 0, ""},
  9899  		{"MemStats.DebugGC", Field, 0, ""},
  9900  		{"MemStats.EnableGC", Field, 0, ""},
  9901  		{"MemStats.Frees", Field, 0, ""},
  9902  		{"MemStats.GCCPUFraction", Field, 5, ""},
  9903  		{"MemStats.GCSys", Field, 2, ""},
  9904  		{"MemStats.HeapAlloc", Field, 0, ""},
  9905  		{"MemStats.HeapIdle", Field, 0, ""},
  9906  		{"MemStats.HeapInuse", Field, 0, ""},
  9907  		{"MemStats.HeapObjects", Field, 0, ""},
  9908  		{"MemStats.HeapReleased", Field, 0, ""},
  9909  		{"MemStats.HeapSys", Field, 0, ""},
  9910  		{"MemStats.LastGC", Field, 0, ""},
  9911  		{"MemStats.Lookups", Field, 0, ""},
  9912  		{"MemStats.MCacheInuse", Field, 0, ""},
  9913  		{"MemStats.MCacheSys", Field, 0, ""},
  9914  		{"MemStats.MSpanInuse", Field, 0, ""},
  9915  		{"MemStats.MSpanSys", Field, 0, ""},
  9916  		{"MemStats.Mallocs", Field, 0, ""},
  9917  		{"MemStats.NextGC", Field, 0, ""},
  9918  		{"MemStats.NumForcedGC", Field, 8, ""},
  9919  		{"MemStats.NumGC", Field, 0, ""},
  9920  		{"MemStats.OtherSys", Field, 2, ""},
  9921  		{"MemStats.PauseEnd", Field, 4, ""},
  9922  		{"MemStats.PauseNs", Field, 0, ""},
  9923  		{"MemStats.PauseTotalNs", Field, 0, ""},
  9924  		{"MemStats.StackInuse", Field, 0, ""},
  9925  		{"MemStats.StackSys", Field, 0, ""},
  9926  		{"MemStats.Sys", Field, 0, ""},
  9927  		{"MemStats.TotalAlloc", Field, 0, ""},
  9928  		{"MutexProfile", Func, 8, "func(p []BlockProfileRecord) (n int, ok bool)"},
  9929  		{"NumCPU", Func, 0, "func() int"},
  9930  		{"NumCgoCall", Func, 0, "func() int64"},
  9931  		{"NumGoroutine", Func, 0, "func() int"},
  9932  		{"PanicNilError", Type, 21, ""},
  9933  		{"Pinner", Type, 21, ""},
  9934  		{"ReadMemStats", Func, 0, "func(m *MemStats)"},
  9935  		{"ReadTrace", Func, 5, "func() []byte"},
  9936  		{"SetBlockProfileRate", Func, 1, "func(rate int)"},
  9937  		{"SetCPUProfileRate", Func, 0, "func(hz int)"},
  9938  		{"SetCgoTraceback", Func, 7, "func(version int, traceback unsafe.Pointer, context unsafe.Pointer, symbolizer unsafe.Pointer)"},
  9939  		{"SetDefaultGOMAXPROCS", Func, 25, "func()"},
  9940  		{"SetFinalizer", Func, 0, "func(obj any, finalizer any)"},
  9941  		{"SetMutexProfileFraction", Func, 8, "func(rate int) int"},
  9942  		{"Stack", Func, 0, "func(buf []byte, all bool) int"},
  9943  		{"StackRecord", Type, 0, ""},
  9944  		{"StackRecord.Stack0", Field, 0, ""},
  9945  		{"StartTrace", Func, 5, "func() error"},
  9946  		{"StopTrace", Func, 5, "func()"},
  9947  		{"ThreadCreateProfile", Func, 0, "func(p []StackRecord) (n int, ok bool)"},
  9948  		{"TypeAssertionError", Type, 0, ""},
  9949  		{"UnlockOSThread", Func, 0, "func()"},
  9950  		{"Version", Func, 0, "func() string"},
  9951  	},
  9952  	"runtime/cgo": {
  9953  		{"(Handle).Delete", Method, 17, ""},
  9954  		{"(Handle).Value", Method, 17, ""},
  9955  		{"Handle", Type, 17, ""},
  9956  		{"Incomplete", Type, 20, ""},
  9957  		{"NewHandle", Func, 17, ""},
  9958  	},
  9959  	"runtime/coverage": {
  9960  		{"ClearCounters", Func, 20, "func() error"},
  9961  		{"WriteCounters", Func, 20, "func(w io.Writer) error"},
  9962  		{"WriteCountersDir", Func, 20, "func(dir string) error"},
  9963  		{"WriteMeta", Func, 20, "func(w io.Writer) error"},
  9964  		{"WriteMetaDir", Func, 20, "func(dir string) error"},
  9965  	},
  9966  	"runtime/debug": {
  9967  		{"(*BuildInfo).String", Method, 18, ""},
  9968  		{"BuildInfo", Type, 12, ""},
  9969  		{"BuildInfo.Deps", Field, 12, ""},
  9970  		{"BuildInfo.GoVersion", Field, 18, ""},
  9971  		{"BuildInfo.Main", Field, 12, ""},
  9972  		{"BuildInfo.Path", Field, 12, ""},
  9973  		{"BuildInfo.Settings", Field, 18, ""},
  9974  		{"BuildSetting", Type, 18, ""},
  9975  		{"BuildSetting.Key", Field, 18, ""},
  9976  		{"BuildSetting.Value", Field, 18, ""},
  9977  		{"CrashOptions", Type, 23, ""},
  9978  		{"FreeOSMemory", Func, 1, "func()"},
  9979  		{"GCStats", Type, 1, ""},
  9980  		{"GCStats.LastGC", Field, 1, ""},
  9981  		{"GCStats.NumGC", Field, 1, ""},
  9982  		{"GCStats.Pause", Field, 1, ""},
  9983  		{"GCStats.PauseEnd", Field, 4, ""},
  9984  		{"GCStats.PauseQuantiles", Field, 1, ""},
  9985  		{"GCStats.PauseTotal", Field, 1, ""},
  9986  		{"Module", Type, 12, ""},
  9987  		{"Module.Path", Field, 12, ""},
  9988  		{"Module.Replace", Field, 12, ""},
  9989  		{"Module.Sum", Field, 12, ""},
  9990  		{"Module.Version", Field, 12, ""},
  9991  		{"ParseBuildInfo", Func, 18, "func(data string) (bi *BuildInfo, err error)"},
  9992  		{"PrintStack", Func, 0, "func()"},
  9993  		{"ReadBuildInfo", Func, 12, "func() (info *BuildInfo, ok bool)"},
  9994  		{"ReadGCStats", Func, 1, "func(stats *GCStats)"},
  9995  		{"SetCrashOutput", Func, 23, "func(f *os.File, opts CrashOptions) error"},
  9996  		{"SetGCPercent", Func, 1, "func(percent int) int"},
  9997  		{"SetMaxStack", Func, 2, "func(bytes int) int"},
  9998  		{"SetMaxThreads", Func, 2, "func(threads int) int"},
  9999  		{"SetMemoryLimit", Func, 19, "func(limit int64) int64"},
 10000  		{"SetPanicOnFault", Func, 3, "func(enabled bool) bool"},
 10001  		{"SetTraceback", Func, 6, "func(level string)"},
 10002  		{"Stack", Func, 0, "func() []byte"},
 10003  		{"WriteHeapDump", Func, 3, "func(fd uintptr)"},
 10004  	},
 10005  	"runtime/metrics": {
 10006  		{"(Value).Float64", Method, 16, ""},
 10007  		{"(Value).Float64Histogram", Method, 16, ""},
 10008  		{"(Value).Kind", Method, 16, ""},
 10009  		{"(Value).Uint64", Method, 16, ""},
 10010  		{"All", Func, 16, "func() []Description"},
 10011  		{"Description", Type, 16, ""},
 10012  		{"Description.Cumulative", Field, 16, ""},
 10013  		{"Description.Description", Field, 16, ""},
 10014  		{"Description.Kind", Field, 16, ""},
 10015  		{"Description.Name", Field, 16, ""},
 10016  		{"Float64Histogram", Type, 16, ""},
 10017  		{"Float64Histogram.Buckets", Field, 16, ""},
 10018  		{"Float64Histogram.Counts", Field, 16, ""},
 10019  		{"KindBad", Const, 16, ""},
 10020  		{"KindFloat64", Const, 16, ""},
 10021  		{"KindFloat64Histogram", Const, 16, ""},
 10022  		{"KindUint64", Const, 16, ""},
 10023  		{"Read", Func, 16, "func(m []Sample)"},
 10024  		{"Sample", Type, 16, ""},
 10025  		{"Sample.Name", Field, 16, ""},
 10026  		{"Sample.Value", Field, 16, ""},
 10027  		{"Value", Type, 16, ""},
 10028  		{"ValueKind", Type, 16, ""},
 10029  	},
 10030  	"runtime/pprof": {
 10031  		{"(*Profile).Add", Method, 0, ""},
 10032  		{"(*Profile).Count", Method, 0, ""},
 10033  		{"(*Profile).Name", Method, 0, ""},
 10034  		{"(*Profile).Remove", Method, 0, ""},
 10035  		{"(*Profile).WriteTo", Method, 0, ""},
 10036  		{"Do", Func, 9, "func(ctx context.Context, labels LabelSet, f func(context.Context))"},
 10037  		{"ForLabels", Func, 9, "func(ctx context.Context, f func(key string, value string) bool)"},
 10038  		{"Label", Func, 9, "func(ctx context.Context, key string) (string, bool)"},
 10039  		{"LabelSet", Type, 9, ""},
 10040  		{"Labels", Func, 9, "func(args ...string) LabelSet"},
 10041  		{"Lookup", Func, 0, "func(name string) *Profile"},
 10042  		{"NewProfile", Func, 0, "func(name string) *Profile"},
 10043  		{"Profile", Type, 0, ""},
 10044  		{"Profiles", Func, 0, "func() []*Profile"},
 10045  		{"SetGoroutineLabels", Func, 9, "func(ctx context.Context)"},
 10046  		{"StartCPUProfile", Func, 0, "func(w io.Writer) error"},
 10047  		{"StopCPUProfile", Func, 0, "func()"},
 10048  		{"WithLabels", Func, 9, "func(ctx context.Context, labels LabelSet) context.Context"},
 10049  		{"WriteHeapProfile", Func, 0, "func(w io.Writer) error"},
 10050  	},
 10051  	"runtime/trace": {
 10052  		{"(*FlightRecorder).Enabled", Method, 25, ""},
 10053  		{"(*FlightRecorder).Start", Method, 25, ""},
 10054  		{"(*FlightRecorder).Stop", Method, 25, ""},
 10055  		{"(*FlightRecorder).WriteTo", Method, 25, ""},
 10056  		{"(*Region).End", Method, 11, ""},
 10057  		{"(*Task).End", Method, 11, ""},
 10058  		{"FlightRecorder", Type, 25, ""},
 10059  		{"FlightRecorderConfig", Type, 25, ""},
 10060  		{"FlightRecorderConfig.MaxBytes", Field, 25, ""},
 10061  		{"FlightRecorderConfig.MinAge", Field, 25, ""},
 10062  		{"IsEnabled", Func, 11, "func() bool"},
 10063  		{"Log", Func, 11, "func(ctx context.Context, category string, message string)"},
 10064  		{"Logf", Func, 11, "func(ctx context.Context, category string, format string, args ...any)"},
 10065  		{"NewFlightRecorder", Func, 25, "func(cfg FlightRecorderConfig) *FlightRecorder"},
 10066  		{"NewTask", Func, 11, "func(pctx context.Context, taskType string) (ctx context.Context, task *Task)"},
 10067  		{"Region", Type, 11, ""},
 10068  		{"Start", Func, 5, "func(w io.Writer) error"},
 10069  		{"StartRegion", Func, 11, "func(ctx context.Context, regionType string) *Region"},
 10070  		{"Stop", Func, 5, "func()"},
 10071  		{"Task", Type, 11, ""},
 10072  		{"WithRegion", Func, 11, "func(ctx context.Context, regionType string, fn func())"},
 10073  	},
 10074  	"slices": {
 10075  		{"All", Func, 23, "func[Slice ~[]E, E any](s Slice) iter.Seq2[int, E]"},
 10076  		{"AppendSeq", Func, 23, "func[Slice ~[]E, E any](s Slice, seq iter.Seq[E]) Slice"},
 10077  		{"Backward", Func, 23, "func[Slice ~[]E, E any](s Slice) iter.Seq2[int, E]"},
 10078  		{"BinarySearch", Func, 21, "func[S ~[]E, E cmp.Ordered](x S, target E) (int, bool)"},
 10079  		{"BinarySearchFunc", Func, 21, "func[S ~[]E, E, T any](x S, target T, cmp func(E, T) int) (int, bool)"},
 10080  		{"Chunk", Func, 23, "func[Slice ~[]E, E any](s Slice, n int) iter.Seq[Slice]"},
 10081  		{"Clip", Func, 21, "func[S ~[]E, E any](s S) S"},
 10082  		{"Clone", Func, 21, "func[S ~[]E, E any](s S) S"},
 10083  		{"Collect", Func, 23, "func[E any](seq iter.Seq[E]) []E"},
 10084  		{"Compact", Func, 21, "func[S ~[]E, E comparable](s S) S"},
 10085  		{"CompactFunc", Func, 21, "func[S ~[]E, E any](s S, eq func(E, E) bool) S"},
 10086  		{"Compare", Func, 21, "func[S ~[]E, E cmp.Ordered](s1 S, s2 S) int"},
 10087  		{"CompareFunc", Func, 21, "func[S1 ~[]E1, S2 ~[]E2, E1, E2 any](s1 S1, s2 S2, cmp func(E1, E2) int) int"},
 10088  		{"Concat", Func, 22, "func[S ~[]E, E any](slices ...S) S"},
 10089  		{"Contains", Func, 21, "func[S ~[]E, E comparable](s S, v E) bool"},
 10090  		{"ContainsFunc", Func, 21, "func[S ~[]E, E any](s S, f func(E) bool) bool"},
 10091  		{"Delete", Func, 21, "func[S ~[]E, E any](s S, i int, j int) S"},
 10092  		{"DeleteFunc", Func, 21, "func[S ~[]E, E any](s S, del func(E) bool) S"},
 10093  		{"Equal", Func, 21, "func[S ~[]E, E comparable](s1 S, s2 S) bool"},
 10094  		{"EqualFunc", Func, 21, "func[S1 ~[]E1, S2 ~[]E2, E1, E2 any](s1 S1, s2 S2, eq func(E1, E2) bool) bool"},
 10095  		{"Grow", Func, 21, "func[S ~[]E, E any](s S, n int) S"},
 10096  		{"Index", Func, 21, "func[S ~[]E, E comparable](s S, v E) int"},
 10097  		{"IndexFunc", Func, 21, "func[S ~[]E, E any](s S, f func(E) bool) int"},
 10098  		{"Insert", Func, 21, "func[S ~[]E, E any](s S, i int, v ...E) S"},
 10099  		{"IsSorted", Func, 21, "func[S ~[]E, E cmp.Ordered](x S) bool"},
 10100  		{"IsSortedFunc", Func, 21, "func[S ~[]E, E any](x S, cmp func(a E, b E) int) bool"},
 10101  		{"Max", Func, 21, "func[S ~[]E, E cmp.Ordered](x S) E"},
 10102  		{"MaxFunc", Func, 21, "func[S ~[]E, E any](x S, cmp func(a E, b E) int) E"},
 10103  		{"Min", Func, 21, "func[S ~[]E, E cmp.Ordered](x S) E"},
 10104  		{"MinFunc", Func, 21, "func[S ~[]E, E any](x S, cmp func(a E, b E) int) E"},
 10105  		{"Repeat", Func, 23, "func[S ~[]E, E any](x S, count int) S"},
 10106  		{"Replace", Func, 21, "func[S ~[]E, E any](s S, i int, j int, v ...E) S"},
 10107  		{"Reverse", Func, 21, "func[S ~[]E, E any](s S)"},
 10108  		{"Sort", Func, 21, "func[S ~[]E, E cmp.Ordered](x S)"},
 10109  		{"SortFunc", Func, 21, "func[S ~[]E, E any](x S, cmp func(a E, b E) int)"},
 10110  		{"SortStableFunc", Func, 21, "func[S ~[]E, E any](x S, cmp func(a E, b E) int)"},
 10111  		{"Sorted", Func, 23, "func[E cmp.Ordered](seq iter.Seq[E]) []E"},
 10112  		{"SortedFunc", Func, 23, "func[E any](seq iter.Seq[E], cmp func(E, E) int) []E"},
 10113  		{"SortedStableFunc", Func, 23, "func[E any](seq iter.Seq[E], cmp func(E, E) int) []E"},
 10114  		{"Values", Func, 23, "func[Slice ~[]E, E any](s Slice) iter.Seq[E]"},
 10115  	},
 10116  	"sort": {
 10117  		{"(Float64Slice).Len", Method, 0, ""},
 10118  		{"(Float64Slice).Less", Method, 0, ""},
 10119  		{"(Float64Slice).Search", Method, 0, ""},
 10120  		{"(Float64Slice).Sort", Method, 0, ""},
 10121  		{"(Float64Slice).Swap", Method, 0, ""},
 10122  		{"(IntSlice).Len", Method, 0, ""},
 10123  		{"(IntSlice).Less", Method, 0, ""},
 10124  		{"(IntSlice).Search", Method, 0, ""},
 10125  		{"(IntSlice).Sort", Method, 0, ""},
 10126  		{"(IntSlice).Swap", Method, 0, ""},
 10127  		{"(StringSlice).Len", Method, 0, ""},
 10128  		{"(StringSlice).Less", Method, 0, ""},
 10129  		{"(StringSlice).Search", Method, 0, ""},
 10130  		{"(StringSlice).Sort", Method, 0, ""},
 10131  		{"(StringSlice).Swap", Method, 0, ""},
 10132  		{"Find", Func, 19, "func(n int, cmp func(int) int) (i int, found bool)"},
 10133  		{"Float64Slice", Type, 0, ""},
 10134  		{"Float64s", Func, 0, "func(x []float64)"},
 10135  		{"Float64sAreSorted", Func, 0, "func(x []float64) bool"},
 10136  		{"IntSlice", Type, 0, ""},
 10137  		{"Interface", Type, 0, ""},
 10138  		{"Ints", Func, 0, "func(x []int)"},
 10139  		{"IntsAreSorted", Func, 0, "func(x []int) bool"},
 10140  		{"IsSorted", Func, 0, "func(data Interface) bool"},
 10141  		{"Reverse", Func, 1, "func(data Interface) Interface"},
 10142  		{"Search", Func, 0, "func(n int, f func(int) bool) int"},
 10143  		{"SearchFloat64s", Func, 0, "func(a []float64, x float64) int"},
 10144  		{"SearchInts", Func, 0, "func(a []int, x int) int"},
 10145  		{"SearchStrings", Func, 0, "func(a []string, x string) int"},
 10146  		{"Slice", Func, 8, "func(x any, less func(i int, j int) bool)"},
 10147  		{"SliceIsSorted", Func, 8, "func(x any, less func(i int, j int) bool) bool"},
 10148  		{"SliceStable", Func, 8, "func(x any, less func(i int, j int) bool)"},
 10149  		{"Sort", Func, 0, "func(data Interface)"},
 10150  		{"Stable", Func, 2, "func(data Interface)"},
 10151  		{"StringSlice", Type, 0, ""},
 10152  		{"Strings", Func, 0, "func(x []string)"},
 10153  		{"StringsAreSorted", Func, 0, "func(x []string) bool"},
 10154  	},
 10155  	"strconv": {
 10156  		{"(*NumError).Error", Method, 0, ""},
 10157  		{"(*NumError).Unwrap", Method, 14, ""},
 10158  		{"AppendBool", Func, 0, "func(dst []byte, b bool) []byte"},
 10159  		{"AppendFloat", Func, 0, "func(dst []byte, f float64, fmt byte, prec int, bitSize int) []byte"},
 10160  		{"AppendInt", Func, 0, "func(dst []byte, i int64, base int) []byte"},
 10161  		{"AppendQuote", Func, 0, "func(dst []byte, s string) []byte"},
 10162  		{"AppendQuoteRune", Func, 0, "func(dst []byte, r rune) []byte"},
 10163  		{"AppendQuoteRuneToASCII", Func, 0, "func(dst []byte, r rune) []byte"},
 10164  		{"AppendQuoteRuneToGraphic", Func, 6, "func(dst []byte, r rune) []byte"},
 10165  		{"AppendQuoteToASCII", Func, 0, "func(dst []byte, s string) []byte"},
 10166  		{"AppendQuoteToGraphic", Func, 6, "func(dst []byte, s string) []byte"},
 10167  		{"AppendUint", Func, 0, "func(dst []byte, i uint64, base int) []byte"},
 10168  		{"Atoi", Func, 0, "func(s string) (int, error)"},
 10169  		{"CanBackquote", Func, 0, "func(s string) bool"},
 10170  		{"ErrRange", Var, 0, ""},
 10171  		{"ErrSyntax", Var, 0, ""},
 10172  		{"FormatBool", Func, 0, "func(b bool) string"},
 10173  		{"FormatComplex", Func, 15, "func(c complex128, fmt byte, prec int, bitSize int) string"},
 10174  		{"FormatFloat", Func, 0, "func(f float64, fmt byte, prec int, bitSize int) string"},
 10175  		{"FormatInt", Func, 0, "func(i int64, base int) string"},
 10176  		{"FormatUint", Func, 0, "func(i uint64, base int) string"},
 10177  		{"IntSize", Const, 0, ""},
 10178  		{"IsGraphic", Func, 6, "func(r rune) bool"},
 10179  		{"IsPrint", Func, 0, "func(r rune) bool"},
 10180  		{"Itoa", Func, 0, "func(i int) string"},
 10181  		{"NumError", Type, 0, ""},
 10182  		{"NumError.Err", Field, 0, ""},
 10183  		{"NumError.Func", Field, 0, ""},
 10184  		{"NumError.Num", Field, 0, ""},
 10185  		{"ParseBool", Func, 0, "func(str string) (bool, error)"},
 10186  		{"ParseComplex", Func, 15, "func(s string, bitSize int) (complex128, error)"},
 10187  		{"ParseFloat", Func, 0, "func(s string, bitSize int) (float64, error)"},
 10188  		{"ParseInt", Func, 0, "func(s string, base int, bitSize int) (i int64, err error)"},
 10189  		{"ParseUint", Func, 0, "func(s string, base int, bitSize int) (uint64, error)"},
 10190  		{"Quote", Func, 0, "func(s string) string"},
 10191  		{"QuoteRune", Func, 0, "func(r rune) string"},
 10192  		{"QuoteRuneToASCII", Func, 0, "func(r rune) string"},
 10193  		{"QuoteRuneToGraphic", Func, 6, "func(r rune) string"},
 10194  		{"QuoteToASCII", Func, 0, "func(s string) string"},
 10195  		{"QuoteToGraphic", Func, 6, "func(s string) string"},
 10196  		{"QuotedPrefix", Func, 17, "func(s string) (string, error)"},
 10197  		{"Unquote", Func, 0, "func(s string) (string, error)"},
 10198  		{"UnquoteChar", Func, 0, "func(s string, quote byte) (value rune, multibyte bool, tail string, err error)"},
 10199  	},
 10200  	"strings": {
 10201  		{"(*Builder).Cap", Method, 12, ""},
 10202  		{"(*Builder).Grow", Method, 10, ""},
 10203  		{"(*Builder).Len", Method, 10, ""},
 10204  		{"(*Builder).Reset", Method, 10, ""},
 10205  		{"(*Builder).String", Method, 10, ""},
 10206  		{"(*Builder).Write", Method, 10, ""},
 10207  		{"(*Builder).WriteByte", Method, 10, ""},
 10208  		{"(*Builder).WriteRune", Method, 10, ""},
 10209  		{"(*Builder).WriteString", Method, 10, ""},
 10210  		{"(*Reader).Len", Method, 0, ""},
 10211  		{"(*Reader).Read", Method, 0, ""},
 10212  		{"(*Reader).ReadAt", Method, 0, ""},
 10213  		{"(*Reader).ReadByte", Method, 0, ""},
 10214  		{"(*Reader).ReadRune", Method, 0, ""},
 10215  		{"(*Reader).Reset", Method, 7, ""},
 10216  		{"(*Reader).Seek", Method, 0, ""},
 10217  		{"(*Reader).Size", Method, 5, ""},
 10218  		{"(*Reader).UnreadByte", Method, 0, ""},
 10219  		{"(*Reader).UnreadRune", Method, 0, ""},
 10220  		{"(*Reader).WriteTo", Method, 1, ""},
 10221  		{"(*Replacer).Replace", Method, 0, ""},
 10222  		{"(*Replacer).WriteString", Method, 0, ""},
 10223  		{"Builder", Type, 10, ""},
 10224  		{"Clone", Func, 18, "func(s string) string"},
 10225  		{"Compare", Func, 5, "func(a string, b string) int"},
 10226  		{"Contains", Func, 0, "func(s string, substr string) bool"},
 10227  		{"ContainsAny", Func, 0, "func(s string, chars string) bool"},
 10228  		{"ContainsFunc", Func, 21, "func(s string, f func(rune) bool) bool"},
 10229  		{"ContainsRune", Func, 0, "func(s string, r rune) bool"},
 10230  		{"Count", Func, 0, "func(s string, substr string) int"},
 10231  		{"Cut", Func, 18, "func(s string, sep string) (before string, after string, found bool)"},
 10232  		{"CutPrefix", Func, 20, "func(s string, prefix string) (after string, found bool)"},
 10233  		{"CutSuffix", Func, 20, "func(s string, suffix string) (before string, found bool)"},
 10234  		{"EqualFold", Func, 0, "func(s string, t string) bool"},
 10235  		{"Fields", Func, 0, "func(s string) []string"},
 10236  		{"FieldsFunc", Func, 0, "func(s string, f func(rune) bool) []string"},
 10237  		{"FieldsFuncSeq", Func, 24, "func(s string, f func(rune) bool) iter.Seq[string]"},
 10238  		{"FieldsSeq", Func, 24, "func(s string) iter.Seq[string]"},
 10239  		{"HasPrefix", Func, 0, "func(s string, prefix string) bool"},
 10240  		{"HasSuffix", Func, 0, "func(s string, suffix string) bool"},
 10241  		{"Index", Func, 0, "func(s string, substr string) int"},
 10242  		{"IndexAny", Func, 0, "func(s string, chars string) int"},
 10243  		{"IndexByte", Func, 2, "func(s string, c byte) int"},
 10244  		{"IndexFunc", Func, 0, "func(s string, f func(rune) bool) int"},
 10245  		{"IndexRune", Func, 0, "func(s string, r rune) int"},
 10246  		{"Join", Func, 0, "func(elems []string, sep string) string"},
 10247  		{"LastIndex", Func, 0, "func(s string, substr string) int"},
 10248  		{"LastIndexAny", Func, 0, "func(s string, chars string) int"},
 10249  		{"LastIndexByte", Func, 5, "func(s string, c byte) int"},
 10250  		{"LastIndexFunc", Func, 0, "func(s string, f func(rune) bool) int"},
 10251  		{"Lines", Func, 24, "func(s string) iter.Seq[string]"},
 10252  		{"Map", Func, 0, "func(mapping func(rune) rune, s string) string"},
 10253  		{"NewReader", Func, 0, "func(s string) *Reader"},
 10254  		{"NewReplacer", Func, 0, "func(oldnew ...string) *Replacer"},
 10255  		{"Reader", Type, 0, ""},
 10256  		{"Repeat", Func, 0, "func(s string, count int) string"},
 10257  		{"Replace", Func, 0, "func(s string, old string, new string, n int) string"},
 10258  		{"ReplaceAll", Func, 12, "func(s string, old string, new string) string"},
 10259  		{"Replacer", Type, 0, ""},
 10260  		{"Split", Func, 0, "func(s string, sep string) []string"},
 10261  		{"SplitAfter", Func, 0, "func(s string, sep string) []string"},
 10262  		{"SplitAfterN", Func, 0, "func(s string, sep string, n int) []string"},
 10263  		{"SplitAfterSeq", Func, 24, "func(s string, sep string) iter.Seq[string]"},
 10264  		{"SplitN", Func, 0, "func(s string, sep string, n int) []string"},
 10265  		{"SplitSeq", Func, 24, "func(s string, sep string) iter.Seq[string]"},
 10266  		{"Title", Func, 0, "func(s string) string"},
 10267  		{"ToLower", Func, 0, "func(s string) string"},
 10268  		{"ToLowerSpecial", Func, 0, "func(c unicode.SpecialCase, s string) string"},
 10269  		{"ToTitle", Func, 0, "func(s string) string"},
 10270  		{"ToTitleSpecial", Func, 0, "func(c unicode.SpecialCase, s string) string"},
 10271  		{"ToUpper", Func, 0, "func(s string) string"},
 10272  		{"ToUpperSpecial", Func, 0, "func(c unicode.SpecialCase, s string) string"},
 10273  		{"ToValidUTF8", Func, 13, "func(s string, replacement string) string"},
 10274  		{"Trim", Func, 0, "func(s string, cutset string) string"},
 10275  		{"TrimFunc", Func, 0, "func(s string, f func(rune) bool) string"},
 10276  		{"TrimLeft", Func, 0, "func(s string, cutset string) string"},
 10277  		{"TrimLeftFunc", Func, 0, "func(s string, f func(rune) bool) string"},
 10278  		{"TrimPrefix", Func, 1, "func(s string, prefix string) string"},
 10279  		{"TrimRight", Func, 0, "func(s string, cutset string) string"},
 10280  		{"TrimRightFunc", Func, 0, "func(s string, f func(rune) bool) string"},
 10281  		{"TrimSpace", Func, 0, "func(s string) string"},
 10282  		{"TrimSuffix", Func, 1, "func(s string, suffix string) string"},
 10283  	},
 10284  	"structs": {
 10285  		{"HostLayout", Type, 23, ""},
 10286  	},
 10287  	"sync": {
 10288  		{"(*Cond).Broadcast", Method, 0, ""},
 10289  		{"(*Cond).Signal", Method, 0, ""},
 10290  		{"(*Cond).Wait", Method, 0, ""},
 10291  		{"(*Map).Clear", Method, 23, ""},
 10292  		{"(*Map).CompareAndDelete", Method, 20, ""},
 10293  		{"(*Map).CompareAndSwap", Method, 20, ""},
 10294  		{"(*Map).Delete", Method, 9, ""},
 10295  		{"(*Map).Load", Method, 9, ""},
 10296  		{"(*Map).LoadAndDelete", Method, 15, ""},
 10297  		{"(*Map).LoadOrStore", Method, 9, ""},
 10298  		{"(*Map).Range", Method, 9, ""},
 10299  		{"(*Map).Store", Method, 9, ""},
 10300  		{"(*Map).Swap", Method, 20, ""},
 10301  		{"(*Mutex).Lock", Method, 0, ""},
 10302  		{"(*Mutex).TryLock", Method, 18, ""},
 10303  		{"(*Mutex).Unlock", Method, 0, ""},
 10304  		{"(*Once).Do", Method, 0, ""},
 10305  		{"(*Pool).Get", Method, 3, ""},
 10306  		{"(*Pool).Put", Method, 3, ""},
 10307  		{"(*RWMutex).Lock", Method, 0, ""},
 10308  		{"(*RWMutex).RLock", Method, 0, ""},
 10309  		{"(*RWMutex).RLocker", Method, 0, ""},
 10310  		{"(*RWMutex).RUnlock", Method, 0, ""},
 10311  		{"(*RWMutex).TryLock", Method, 18, ""},
 10312  		{"(*RWMutex).TryRLock", Method, 18, ""},
 10313  		{"(*RWMutex).Unlock", Method, 0, ""},
 10314  		{"(*WaitGroup).Add", Method, 0, ""},
 10315  		{"(*WaitGroup).Done", Method, 0, ""},
 10316  		{"(*WaitGroup).Go", Method, 25, ""},
 10317  		{"(*WaitGroup).Wait", Method, 0, ""},
 10318  		{"Cond", Type, 0, ""},
 10319  		{"Cond.L", Field, 0, ""},
 10320  		{"Locker", Type, 0, ""},
 10321  		{"Map", Type, 9, ""},
 10322  		{"Mutex", Type, 0, ""},
 10323  		{"NewCond", Func, 0, "func(l Locker) *Cond"},
 10324  		{"Once", Type, 0, ""},
 10325  		{"OnceFunc", Func, 21, "func(f func()) func()"},
 10326  		{"OnceValue", Func, 21, "func[T any](f func() T) func() T"},
 10327  		{"OnceValues", Func, 21, "func[T1, T2 any](f func() (T1, T2)) func() (T1, T2)"},
 10328  		{"Pool", Type, 3, ""},
 10329  		{"Pool.New", Field, 3, ""},
 10330  		{"RWMutex", Type, 0, ""},
 10331  		{"WaitGroup", Type, 0, ""},
 10332  	},
 10333  	"sync/atomic": {
 10334  		{"(*Bool).CompareAndSwap", Method, 19, ""},
 10335  		{"(*Bool).Load", Method, 19, ""},
 10336  		{"(*Bool).Store", Method, 19, ""},
 10337  		{"(*Bool).Swap", Method, 19, ""},
 10338  		{"(*Int32).Add", Method, 19, ""},
 10339  		{"(*Int32).And", Method, 23, ""},
 10340  		{"(*Int32).CompareAndSwap", Method, 19, ""},
 10341  		{"(*Int32).Load", Method, 19, ""},
 10342  		{"(*Int32).Or", Method, 23, ""},
 10343  		{"(*Int32).Store", Method, 19, ""},
 10344  		{"(*Int32).Swap", Method, 19, ""},
 10345  		{"(*Int64).Add", Method, 19, ""},
 10346  		{"(*Int64).And", Method, 23, ""},
 10347  		{"(*Int64).CompareAndSwap", Method, 19, ""},
 10348  		{"(*Int64).Load", Method, 19, ""},
 10349  		{"(*Int64).Or", Method, 23, ""},
 10350  		{"(*Int64).Store", Method, 19, ""},
 10351  		{"(*Int64).Swap", Method, 19, ""},
 10352  		{"(*Pointer).CompareAndSwap", Method, 19, ""},
 10353  		{"(*Pointer).Load", Method, 19, ""},
 10354  		{"(*Pointer).Store", Method, 19, ""},
 10355  		{"(*Pointer).Swap", Method, 19, ""},
 10356  		{"(*Uint32).Add", Method, 19, ""},
 10357  		{"(*Uint32).And", Method, 23, ""},
 10358  		{"(*Uint32).CompareAndSwap", Method, 19, ""},
 10359  		{"(*Uint32).Load", Method, 19, ""},
 10360  		{"(*Uint32).Or", Method, 23, ""},
 10361  		{"(*Uint32).Store", Method, 19, ""},
 10362  		{"(*Uint32).Swap", Method, 19, ""},
 10363  		{"(*Uint64).Add", Method, 19, ""},
 10364  		{"(*Uint64).And", Method, 23, ""},
 10365  		{"(*Uint64).CompareAndSwap", Method, 19, ""},
 10366  		{"(*Uint64).Load", Method, 19, ""},
 10367  		{"(*Uint64).Or", Method, 23, ""},
 10368  		{"(*Uint64).Store", Method, 19, ""},
 10369  		{"(*Uint64).Swap", Method, 19, ""},
 10370  		{"(*Uintptr).Add", Method, 19, ""},
 10371  		{"(*Uintptr).And", Method, 23, ""},
 10372  		{"(*Uintptr).CompareAndSwap", Method, 19, ""},
 10373  		{"(*Uintptr).Load", Method, 19, ""},
 10374  		{"(*Uintptr).Or", Method, 23, ""},
 10375  		{"(*Uintptr).Store", Method, 19, ""},
 10376  		{"(*Uintptr).Swap", Method, 19, ""},
 10377  		{"(*Value).CompareAndSwap", Method, 17, ""},
 10378  		{"(*Value).Load", Method, 4, ""},
 10379  		{"(*Value).Store", Method, 4, ""},
 10380  		{"(*Value).Swap", Method, 17, ""},
 10381  		{"AddInt32", Func, 0, "func(addr *int32, delta int32) (new int32)"},
 10382  		{"AddInt64", Func, 0, "func(addr *int64, delta int64) (new int64)"},
 10383  		{"AddUint32", Func, 0, "func(addr *uint32, delta uint32) (new uint32)"},
 10384  		{"AddUint64", Func, 0, "func(addr *uint64, delta uint64) (new uint64)"},
 10385  		{"AddUintptr", Func, 0, "func(addr *uintptr, delta uintptr) (new uintptr)"},
 10386  		{"AndInt32", Func, 23, "func(addr *int32, mask int32) (old int32)"},
 10387  		{"AndInt64", Func, 23, "func(addr *int64, mask int64) (old int64)"},
 10388  		{"AndUint32", Func, 23, "func(addr *uint32, mask uint32) (old uint32)"},
 10389  		{"AndUint64", Func, 23, "func(addr *uint64, mask uint64) (old uint64)"},
 10390  		{"AndUintptr", Func, 23, "func(addr *uintptr, mask uintptr) (old uintptr)"},
 10391  		{"Bool", Type, 19, ""},
 10392  		{"CompareAndSwapInt32", Func, 0, "func(addr *int32, old int32, new int32) (swapped bool)"},
 10393  		{"CompareAndSwapInt64", Func, 0, "func(addr *int64, old int64, new int64) (swapped bool)"},
 10394  		{"CompareAndSwapPointer", Func, 0, "func(addr *unsafe.Pointer, old unsafe.Pointer, new unsafe.Pointer) (swapped bool)"},
 10395  		{"CompareAndSwapUint32", Func, 0, "func(addr *uint32, old uint32, new uint32) (swapped bool)"},
 10396  		{"CompareAndSwapUint64", Func, 0, "func(addr *uint64, old uint64, new uint64) (swapped bool)"},
 10397  		{"CompareAndSwapUintptr", Func, 0, "func(addr *uintptr, old uintptr, new uintptr) (swapped bool)"},
 10398  		{"Int32", Type, 19, ""},
 10399  		{"Int64", Type, 19, ""},
 10400  		{"LoadInt32", Func, 0, "func(addr *int32) (val int32)"},
 10401  		{"LoadInt64", Func, 0, "func(addr *int64) (val int64)"},
 10402  		{"LoadPointer", Func, 0, "func(addr *unsafe.Pointer) (val unsafe.Pointer)"},
 10403  		{"LoadUint32", Func, 0, "func(addr *uint32) (val uint32)"},
 10404  		{"LoadUint64", Func, 0, "func(addr *uint64) (val uint64)"},
 10405  		{"LoadUintptr", Func, 0, "func(addr *uintptr) (val uintptr)"},
 10406  		{"OrInt32", Func, 23, "func(addr *int32, mask int32) (old int32)"},
 10407  		{"OrInt64", Func, 23, "func(addr *int64, mask int64) (old int64)"},
 10408  		{"OrUint32", Func, 23, "func(addr *uint32, mask uint32) (old uint32)"},
 10409  		{"OrUint64", Func, 23, "func(addr *uint64, mask uint64) (old uint64)"},
 10410  		{"OrUintptr", Func, 23, "func(addr *uintptr, mask uintptr) (old uintptr)"},
 10411  		{"Pointer", Type, 19, ""},
 10412  		{"StoreInt32", Func, 0, "func(addr *int32, val int32)"},
 10413  		{"StoreInt64", Func, 0, "func(addr *int64, val int64)"},
 10414  		{"StorePointer", Func, 0, "func(addr *unsafe.Pointer, val unsafe.Pointer)"},
 10415  		{"StoreUint32", Func, 0, "func(addr *uint32, val uint32)"},
 10416  		{"StoreUint64", Func, 0, "func(addr *uint64, val uint64)"},
 10417  		{"StoreUintptr", Func, 0, "func(addr *uintptr, val uintptr)"},
 10418  		{"SwapInt32", Func, 2, "func(addr *int32, new int32) (old int32)"},
 10419  		{"SwapInt64", Func, 2, "func(addr *int64, new int64) (old int64)"},
 10420  		{"SwapPointer", Func, 2, "func(addr *unsafe.Pointer, new unsafe.Pointer) (old unsafe.Pointer)"},
 10421  		{"SwapUint32", Func, 2, "func(addr *uint32, new uint32) (old uint32)"},
 10422  		{"SwapUint64", Func, 2, "func(addr *uint64, new uint64) (old uint64)"},
 10423  		{"SwapUintptr", Func, 2, "func(addr *uintptr, new uintptr) (old uintptr)"},
 10424  		{"Uint32", Type, 19, ""},
 10425  		{"Uint64", Type, 19, ""},
 10426  		{"Uintptr", Type, 19, ""},
 10427  		{"Value", Type, 4, ""},
 10428  	},
 10429  	"syscall": {
 10430  		{"(*Cmsghdr).SetLen", Method, 0, ""},
 10431  		{"(*DLL).FindProc", Method, 0, ""},
 10432  		{"(*DLL).MustFindProc", Method, 0, ""},
 10433  		{"(*DLL).Release", Method, 0, ""},
 10434  		{"(*DLLError).Error", Method, 0, ""},
 10435  		{"(*DLLError).Unwrap", Method, 16, ""},
 10436  		{"(*Filetime).Nanoseconds", Method, 0, ""},
 10437  		{"(*Iovec).SetLen", Method, 0, ""},
 10438  		{"(*LazyDLL).Handle", Method, 0, ""},
 10439  		{"(*LazyDLL).Load", Method, 0, ""},
 10440  		{"(*LazyDLL).NewProc", Method, 0, ""},
 10441  		{"(*LazyProc).Addr", Method, 0, ""},
 10442  		{"(*LazyProc).Call", Method, 0, ""},
 10443  		{"(*LazyProc).Find", Method, 0, ""},
 10444  		{"(*Msghdr).SetControllen", Method, 0, ""},
 10445  		{"(*Proc).Addr", Method, 0, ""},
 10446  		{"(*Proc).Call", Method, 0, ""},
 10447  		{"(*PtraceRegs).PC", Method, 0, ""},
 10448  		{"(*PtraceRegs).SetPC", Method, 0, ""},
 10449  		{"(*RawSockaddrAny).Sockaddr", Method, 0, ""},
 10450  		{"(*SID).Copy", Method, 0, ""},
 10451  		{"(*SID).Len", Method, 0, ""},
 10452  		{"(*SID).LookupAccount", Method, 0, ""},
 10453  		{"(*SID).String", Method, 0, ""},
 10454  		{"(*Timespec).Nano", Method, 0, ""},
 10455  		{"(*Timespec).Unix", Method, 0, ""},
 10456  		{"(*Timeval).Nano", Method, 0, ""},
 10457  		{"(*Timeval).Nanoseconds", Method, 0, ""},
 10458  		{"(*Timeval).Unix", Method, 0, ""},
 10459  		{"(Errno).Error", Method, 0, ""},
 10460  		{"(Errno).Is", Method, 13, ""},
 10461  		{"(Errno).Temporary", Method, 0, ""},
 10462  		{"(Errno).Timeout", Method, 0, ""},
 10463  		{"(Signal).Signal", Method, 0, ""},
 10464  		{"(Signal).String", Method, 0, ""},
 10465  		{"(Token).Close", Method, 0, ""},
 10466  		{"(Token).GetTokenPrimaryGroup", Method, 0, ""},
 10467  		{"(Token).GetTokenUser", Method, 0, ""},
 10468  		{"(Token).GetUserProfileDirectory", Method, 0, ""},
 10469  		{"(WaitStatus).Continued", Method, 0, ""},
 10470  		{"(WaitStatus).CoreDump", Method, 0, ""},
 10471  		{"(WaitStatus).ExitStatus", Method, 0, ""},
 10472  		{"(WaitStatus).Exited", Method, 0, ""},
 10473  		{"(WaitStatus).Signal", Method, 0, ""},
 10474  		{"(WaitStatus).Signaled", Method, 0, ""},
 10475  		{"(WaitStatus).StopSignal", Method, 0, ""},
 10476  		{"(WaitStatus).Stopped", Method, 0, ""},
 10477  		{"(WaitStatus).TrapCause", Method, 0, ""},
 10478  		{"AF_ALG", Const, 0, ""},
 10479  		{"AF_APPLETALK", Const, 0, ""},
 10480  		{"AF_ARP", Const, 0, ""},
 10481  		{"AF_ASH", Const, 0, ""},
 10482  		{"AF_ATM", Const, 0, ""},
 10483  		{"AF_ATMPVC", Const, 0, ""},
 10484  		{"AF_ATMSVC", Const, 0, ""},
 10485  		{"AF_AX25", Const, 0, ""},
 10486  		{"AF_BLUETOOTH", Const, 0, ""},
 10487  		{"AF_BRIDGE", Const, 0, ""},
 10488  		{"AF_CAIF", Const, 0, ""},
 10489  		{"AF_CAN", Const, 0, ""},
 10490  		{"AF_CCITT", Const, 0, ""},
 10491  		{"AF_CHAOS", Const, 0, ""},
 10492  		{"AF_CNT", Const, 0, ""},
 10493  		{"AF_COIP", Const, 0, ""},
 10494  		{"AF_DATAKIT", Const, 0, ""},
 10495  		{"AF_DECnet", Const, 0, ""},
 10496  		{"AF_DLI", Const, 0, ""},
 10497  		{"AF_E164", Const, 0, ""},
 10498  		{"AF_ECMA", Const, 0, ""},
 10499  		{"AF_ECONET", Const, 0, ""},
 10500  		{"AF_ENCAP", Const, 1, ""},
 10501  		{"AF_FILE", Const, 0, ""},
 10502  		{"AF_HYLINK", Const, 0, ""},
 10503  		{"AF_IEEE80211", Const, 0, ""},
 10504  		{"AF_IEEE802154", Const, 0, ""},
 10505  		{"AF_IMPLINK", Const, 0, ""},
 10506  		{"AF_INET", Const, 0, ""},
 10507  		{"AF_INET6", Const, 0, ""},
 10508  		{"AF_INET6_SDP", Const, 3, ""},
 10509  		{"AF_INET_SDP", Const, 3, ""},
 10510  		{"AF_IPX", Const, 0, ""},
 10511  		{"AF_IRDA", Const, 0, ""},
 10512  		{"AF_ISDN", Const, 0, ""},
 10513  		{"AF_ISO", Const, 0, ""},
 10514  		{"AF_IUCV", Const, 0, ""},
 10515  		{"AF_KEY", Const, 0, ""},
 10516  		{"AF_LAT", Const, 0, ""},
 10517  		{"AF_LINK", Const, 0, ""},
 10518  		{"AF_LLC", Const, 0, ""},
 10519  		{"AF_LOCAL", Const, 0, ""},
 10520  		{"AF_MAX", Const, 0, ""},
 10521  		{"AF_MPLS", Const, 1, ""},
 10522  		{"AF_NATM", Const, 0, ""},
 10523  		{"AF_NDRV", Const, 0, ""},
 10524  		{"AF_NETBEUI", Const, 0, ""},
 10525  		{"AF_NETBIOS", Const, 0, ""},
 10526  		{"AF_NETGRAPH", Const, 0, ""},
 10527  		{"AF_NETLINK", Const, 0, ""},
 10528  		{"AF_NETROM", Const, 0, ""},
 10529  		{"AF_NS", Const, 0, ""},
 10530  		{"AF_OROUTE", Const, 1, ""},
 10531  		{"AF_OSI", Const, 0, ""},
 10532  		{"AF_PACKET", Const, 0, ""},
 10533  		{"AF_PHONET", Const, 0, ""},
 10534  		{"AF_PPP", Const, 0, ""},
 10535  		{"AF_PPPOX", Const, 0, ""},
 10536  		{"AF_PUP", Const, 0, ""},
 10537  		{"AF_RDS", Const, 0, ""},
 10538  		{"AF_RESERVED_36", Const, 0, ""},
 10539  		{"AF_ROSE", Const, 0, ""},
 10540  		{"AF_ROUTE", Const, 0, ""},
 10541  		{"AF_RXRPC", Const, 0, ""},
 10542  		{"AF_SCLUSTER", Const, 0, ""},
 10543  		{"AF_SECURITY", Const, 0, ""},
 10544  		{"AF_SIP", Const, 0, ""},
 10545  		{"AF_SLOW", Const, 0, ""},
 10546  		{"AF_SNA", Const, 0, ""},
 10547  		{"AF_SYSTEM", Const, 0, ""},
 10548  		{"AF_TIPC", Const, 0, ""},
 10549  		{"AF_UNIX", Const, 0, ""},
 10550  		{"AF_UNSPEC", Const, 0, ""},
 10551  		{"AF_UTUN", Const, 16, ""},
 10552  		{"AF_VENDOR00", Const, 0, ""},
 10553  		{"AF_VENDOR01", Const, 0, ""},
 10554  		{"AF_VENDOR02", Const, 0, ""},
 10555  		{"AF_VENDOR03", Const, 0, ""},
 10556  		{"AF_VENDOR04", Const, 0, ""},
 10557  		{"AF_VENDOR05", Const, 0, ""},
 10558  		{"AF_VENDOR06", Const, 0, ""},
 10559  		{"AF_VENDOR07", Const, 0, ""},
 10560  		{"AF_VENDOR08", Const, 0, ""},
 10561  		{"AF_VENDOR09", Const, 0, ""},
 10562  		{"AF_VENDOR10", Const, 0, ""},
 10563  		{"AF_VENDOR11", Const, 0, ""},
 10564  		{"AF_VENDOR12", Const, 0, ""},
 10565  		{"AF_VENDOR13", Const, 0, ""},
 10566  		{"AF_VENDOR14", Const, 0, ""},
 10567  		{"AF_VENDOR15", Const, 0, ""},
 10568  		{"AF_VENDOR16", Const, 0, ""},
 10569  		{"AF_VENDOR17", Const, 0, ""},
 10570  		{"AF_VENDOR18", Const, 0, ""},
 10571  		{"AF_VENDOR19", Const, 0, ""},
 10572  		{"AF_VENDOR20", Const, 0, ""},
 10573  		{"AF_VENDOR21", Const, 0, ""},
 10574  		{"AF_VENDOR22", Const, 0, ""},
 10575  		{"AF_VENDOR23", Const, 0, ""},
 10576  		{"AF_VENDOR24", Const, 0, ""},
 10577  		{"AF_VENDOR25", Const, 0, ""},
 10578  		{"AF_VENDOR26", Const, 0, ""},
 10579  		{"AF_VENDOR27", Const, 0, ""},
 10580  		{"AF_VENDOR28", Const, 0, ""},
 10581  		{"AF_VENDOR29", Const, 0, ""},
 10582  		{"AF_VENDOR30", Const, 0, ""},
 10583  		{"AF_VENDOR31", Const, 0, ""},
 10584  		{"AF_VENDOR32", Const, 0, ""},
 10585  		{"AF_VENDOR33", Const, 0, ""},
 10586  		{"AF_VENDOR34", Const, 0, ""},
 10587  		{"AF_VENDOR35", Const, 0, ""},
 10588  		{"AF_VENDOR36", Const, 0, ""},
 10589  		{"AF_VENDOR37", Const, 0, ""},
 10590  		{"AF_VENDOR38", Const, 0, ""},
 10591  		{"AF_VENDOR39", Const, 0, ""},
 10592  		{"AF_VENDOR40", Const, 0, ""},
 10593  		{"AF_VENDOR41", Const, 0, ""},
 10594  		{"AF_VENDOR42", Const, 0, ""},
 10595  		{"AF_VENDOR43", Const, 0, ""},
 10596  		{"AF_VENDOR44", Const, 0, ""},
 10597  		{"AF_VENDOR45", Const, 0, ""},
 10598  		{"AF_VENDOR46", Const, 0, ""},
 10599  		{"AF_VENDOR47", Const, 0, ""},
 10600  		{"AF_WANPIPE", Const, 0, ""},
 10601  		{"AF_X25", Const, 0, ""},
 10602  		{"AI_CANONNAME", Const, 1, ""},
 10603  		{"AI_NUMERICHOST", Const, 1, ""},
 10604  		{"AI_PASSIVE", Const, 1, ""},
 10605  		{"APPLICATION_ERROR", Const, 0, ""},
 10606  		{"ARPHRD_ADAPT", Const, 0, ""},
 10607  		{"ARPHRD_APPLETLK", Const, 0, ""},
 10608  		{"ARPHRD_ARCNET", Const, 0, ""},
 10609  		{"ARPHRD_ASH", Const, 0, ""},
 10610  		{"ARPHRD_ATM", Const, 0, ""},
 10611  		{"ARPHRD_AX25", Const, 0, ""},
 10612  		{"ARPHRD_BIF", Const, 0, ""},
 10613  		{"ARPHRD_CHAOS", Const, 0, ""},
 10614  		{"ARPHRD_CISCO", Const, 0, ""},
 10615  		{"ARPHRD_CSLIP", Const, 0, ""},
 10616  		{"ARPHRD_CSLIP6", Const, 0, ""},
 10617  		{"ARPHRD_DDCMP", Const, 0, ""},
 10618  		{"ARPHRD_DLCI", Const, 0, ""},
 10619  		{"ARPHRD_ECONET", Const, 0, ""},
 10620  		{"ARPHRD_EETHER", Const, 0, ""},
 10621  		{"ARPHRD_ETHER", Const, 0, ""},
 10622  		{"ARPHRD_EUI64", Const, 0, ""},
 10623  		{"ARPHRD_FCAL", Const, 0, ""},
 10624  		{"ARPHRD_FCFABRIC", Const, 0, ""},
 10625  		{"ARPHRD_FCPL", Const, 0, ""},
 10626  		{"ARPHRD_FCPP", Const, 0, ""},
 10627  		{"ARPHRD_FDDI", Const, 0, ""},
 10628  		{"ARPHRD_FRAD", Const, 0, ""},
 10629  		{"ARPHRD_FRELAY", Const, 1, ""},
 10630  		{"ARPHRD_HDLC", Const, 0, ""},
 10631  		{"ARPHRD_HIPPI", Const, 0, ""},
 10632  		{"ARPHRD_HWX25", Const, 0, ""},
 10633  		{"ARPHRD_IEEE1394", Const, 0, ""},
 10634  		{"ARPHRD_IEEE802", Const, 0, ""},
 10635  		{"ARPHRD_IEEE80211", Const, 0, ""},
 10636  		{"ARPHRD_IEEE80211_PRISM", Const, 0, ""},
 10637  		{"ARPHRD_IEEE80211_RADIOTAP", Const, 0, ""},
 10638  		{"ARPHRD_IEEE802154", Const, 0, ""},
 10639  		{"ARPHRD_IEEE802154_PHY", Const, 0, ""},
 10640  		{"ARPHRD_IEEE802_TR", Const, 0, ""},
 10641  		{"ARPHRD_INFINIBAND", Const, 0, ""},
 10642  		{"ARPHRD_IPDDP", Const, 0, ""},
 10643  		{"ARPHRD_IPGRE", Const, 0, ""},
 10644  		{"ARPHRD_IRDA", Const, 0, ""},
 10645  		{"ARPHRD_LAPB", Const, 0, ""},
 10646  		{"ARPHRD_LOCALTLK", Const, 0, ""},
 10647  		{"ARPHRD_LOOPBACK", Const, 0, ""},
 10648  		{"ARPHRD_METRICOM", Const, 0, ""},
 10649  		{"ARPHRD_NETROM", Const, 0, ""},
 10650  		{"ARPHRD_NONE", Const, 0, ""},
 10651  		{"ARPHRD_PIMREG", Const, 0, ""},
 10652  		{"ARPHRD_PPP", Const, 0, ""},
 10653  		{"ARPHRD_PRONET", Const, 0, ""},
 10654  		{"ARPHRD_RAWHDLC", Const, 0, ""},
 10655  		{"ARPHRD_ROSE", Const, 0, ""},
 10656  		{"ARPHRD_RSRVD", Const, 0, ""},
 10657  		{"ARPHRD_SIT", Const, 0, ""},
 10658  		{"ARPHRD_SKIP", Const, 0, ""},
 10659  		{"ARPHRD_SLIP", Const, 0, ""},
 10660  		{"ARPHRD_SLIP6", Const, 0, ""},
 10661  		{"ARPHRD_STRIP", Const, 1, ""},
 10662  		{"ARPHRD_TUNNEL", Const, 0, ""},
 10663  		{"ARPHRD_TUNNEL6", Const, 0, ""},
 10664  		{"ARPHRD_VOID", Const, 0, ""},
 10665  		{"ARPHRD_X25", Const, 0, ""},
 10666  		{"AUTHTYPE_CLIENT", Const, 0, ""},
 10667  		{"AUTHTYPE_SERVER", Const, 0, ""},
 10668  		{"Accept", Func, 0, "func(fd int) (nfd int, sa Sockaddr, err error)"},
 10669  		{"Accept4", Func, 1, "func(fd int, flags int) (nfd int, sa Sockaddr, err error)"},
 10670  		{"AcceptEx", Func, 0, ""},
 10671  		{"Access", Func, 0, "func(path string, mode uint32) (err error)"},
 10672  		{"Acct", Func, 0, "func(path string) (err error)"},
 10673  		{"AddrinfoW", Type, 1, ""},
 10674  		{"AddrinfoW.Addr", Field, 1, ""},
 10675  		{"AddrinfoW.Addrlen", Field, 1, ""},
 10676  		{"AddrinfoW.Canonname", Field, 1, ""},
 10677  		{"AddrinfoW.Family", Field, 1, ""},
 10678  		{"AddrinfoW.Flags", Field, 1, ""},
 10679  		{"AddrinfoW.Next", Field, 1, ""},
 10680  		{"AddrinfoW.Protocol", Field, 1, ""},
 10681  		{"AddrinfoW.Socktype", Field, 1, ""},
 10682  		{"Adjtime", Func, 0, ""},
 10683  		{"Adjtimex", Func, 0, "func(buf *Timex) (state int, err error)"},
 10684  		{"AllThreadsSyscall", Func, 16, "func(trap uintptr, a1 uintptr, a2 uintptr, a3 uintptr) (r1 uintptr, r2 uintptr, err Errno)"},
 10685  		{"AllThreadsSyscall6", Func, 16, "func(trap uintptr, a1 uintptr, a2 uintptr, a3 uintptr, a4 uintptr, a5 uintptr, a6 uintptr) (r1 uintptr, r2 uintptr, err Errno)"},
 10686  		{"AttachLsf", Func, 0, "func(fd int, i []SockFilter) error"},
 10687  		{"B0", Const, 0, ""},
 10688  		{"B1000000", Const, 0, ""},
 10689  		{"B110", Const, 0, ""},
 10690  		{"B115200", Const, 0, ""},
 10691  		{"B1152000", Const, 0, ""},
 10692  		{"B1200", Const, 0, ""},
 10693  		{"B134", Const, 0, ""},
 10694  		{"B14400", Const, 1, ""},
 10695  		{"B150", Const, 0, ""},
 10696  		{"B1500000", Const, 0, ""},
 10697  		{"B1800", Const, 0, ""},
 10698  		{"B19200", Const, 0, ""},
 10699  		{"B200", Const, 0, ""},
 10700  		{"B2000000", Const, 0, ""},
 10701  		{"B230400", Const, 0, ""},
 10702  		{"B2400", Const, 0, ""},
 10703  		{"B2500000", Const, 0, ""},
 10704  		{"B28800", Const, 1, ""},
 10705  		{"B300", Const, 0, ""},
 10706  		{"B3000000", Const, 0, ""},
 10707  		{"B3500000", Const, 0, ""},
 10708  		{"B38400", Const, 0, ""},
 10709  		{"B4000000", Const, 0, ""},
 10710  		{"B460800", Const, 0, ""},
 10711  		{"B4800", Const, 0, ""},
 10712  		{"B50", Const, 0, ""},
 10713  		{"B500000", Const, 0, ""},
 10714  		{"B57600", Const, 0, ""},
 10715  		{"B576000", Const, 0, ""},
 10716  		{"B600", Const, 0, ""},
 10717  		{"B7200", Const, 1, ""},
 10718  		{"B75", Const, 0, ""},
 10719  		{"B76800", Const, 1, ""},
 10720  		{"B921600", Const, 0, ""},
 10721  		{"B9600", Const, 0, ""},
 10722  		{"BASE_PROTOCOL", Const, 2, ""},
 10723  		{"BIOCFEEDBACK", Const, 0, ""},
 10724  		{"BIOCFLUSH", Const, 0, ""},
 10725  		{"BIOCGBLEN", Const, 0, ""},
 10726  		{"BIOCGDIRECTION", Const, 0, ""},
 10727  		{"BIOCGDIRFILT", Const, 1, ""},
 10728  		{"BIOCGDLT", Const, 0, ""},
 10729  		{"BIOCGDLTLIST", Const, 0, ""},
 10730  		{"BIOCGETBUFMODE", Const, 0, ""},
 10731  		{"BIOCGETIF", Const, 0, ""},
 10732  		{"BIOCGETZMAX", Const, 0, ""},
 10733  		{"BIOCGFEEDBACK", Const, 1, ""},
 10734  		{"BIOCGFILDROP", Const, 1, ""},
 10735  		{"BIOCGHDRCMPLT", Const, 0, ""},
 10736  		{"BIOCGRSIG", Const, 0, ""},
 10737  		{"BIOCGRTIMEOUT", Const, 0, ""},
 10738  		{"BIOCGSEESENT", Const, 0, ""},
 10739  		{"BIOCGSTATS", Const, 0, ""},
 10740  		{"BIOCGSTATSOLD", Const, 1, ""},
 10741  		{"BIOCGTSTAMP", Const, 1, ""},
 10742  		{"BIOCIMMEDIATE", Const, 0, ""},
 10743  		{"BIOCLOCK", Const, 0, ""},
 10744  		{"BIOCPROMISC", Const, 0, ""},
 10745  		{"BIOCROTZBUF", Const, 0, ""},
 10746  		{"BIOCSBLEN", Const, 0, ""},
 10747  		{"BIOCSDIRECTION", Const, 0, ""},
 10748  		{"BIOCSDIRFILT", Const, 1, ""},
 10749  		{"BIOCSDLT", Const, 0, ""},
 10750  		{"BIOCSETBUFMODE", Const, 0, ""},
 10751  		{"BIOCSETF", Const, 0, ""},
 10752  		{"BIOCSETFNR", Const, 0, ""},
 10753  		{"BIOCSETIF", Const, 0, ""},
 10754  		{"BIOCSETWF", Const, 0, ""},
 10755  		{"BIOCSETZBUF", Const, 0, ""},
 10756  		{"BIOCSFEEDBACK", Const, 1, ""},
 10757  		{"BIOCSFILDROP", Const, 1, ""},
 10758  		{"BIOCSHDRCMPLT", Const, 0, ""},
 10759  		{"BIOCSRSIG", Const, 0, ""},
 10760  		{"BIOCSRTIMEOUT", Const, 0, ""},
 10761  		{"BIOCSSEESENT", Const, 0, ""},
 10762  		{"BIOCSTCPF", Const, 1, ""},
 10763  		{"BIOCSTSTAMP", Const, 1, ""},
 10764  		{"BIOCSUDPF", Const, 1, ""},
 10765  		{"BIOCVERSION", Const, 0, ""},
 10766  		{"BPF_A", Const, 0, ""},
 10767  		{"BPF_ABS", Const, 0, ""},
 10768  		{"BPF_ADD", Const, 0, ""},
 10769  		{"BPF_ALIGNMENT", Const, 0, ""},
 10770  		{"BPF_ALIGNMENT32", Const, 1, ""},
 10771  		{"BPF_ALU", Const, 0, ""},
 10772  		{"BPF_AND", Const, 0, ""},
 10773  		{"BPF_B", Const, 0, ""},
 10774  		{"BPF_BUFMODE_BUFFER", Const, 0, ""},
 10775  		{"BPF_BUFMODE_ZBUF", Const, 0, ""},
 10776  		{"BPF_DFLTBUFSIZE", Const, 1, ""},
 10777  		{"BPF_DIRECTION_IN", Const, 1, ""},
 10778  		{"BPF_DIRECTION_OUT", Const, 1, ""},
 10779  		{"BPF_DIV", Const, 0, ""},
 10780  		{"BPF_H", Const, 0, ""},
 10781  		{"BPF_IMM", Const, 0, ""},
 10782  		{"BPF_IND", Const, 0, ""},
 10783  		{"BPF_JA", Const, 0, ""},
 10784  		{"BPF_JEQ", Const, 0, ""},
 10785  		{"BPF_JGE", Const, 0, ""},
 10786  		{"BPF_JGT", Const, 0, ""},
 10787  		{"BPF_JMP", Const, 0, ""},
 10788  		{"BPF_JSET", Const, 0, ""},
 10789  		{"BPF_K", Const, 0, ""},
 10790  		{"BPF_LD", Const, 0, ""},
 10791  		{"BPF_LDX", Const, 0, ""},
 10792  		{"BPF_LEN", Const, 0, ""},
 10793  		{"BPF_LSH", Const, 0, ""},
 10794  		{"BPF_MAJOR_VERSION", Const, 0, ""},
 10795  		{"BPF_MAXBUFSIZE", Const, 0, ""},
 10796  		{"BPF_MAXINSNS", Const, 0, ""},
 10797  		{"BPF_MEM", Const, 0, ""},
 10798  		{"BPF_MEMWORDS", Const, 0, ""},
 10799  		{"BPF_MINBUFSIZE", Const, 0, ""},
 10800  		{"BPF_MINOR_VERSION", Const, 0, ""},
 10801  		{"BPF_MISC", Const, 0, ""},
 10802  		{"BPF_MSH", Const, 0, ""},
 10803  		{"BPF_MUL", Const, 0, ""},
 10804  		{"BPF_NEG", Const, 0, ""},
 10805  		{"BPF_OR", Const, 0, ""},
 10806  		{"BPF_RELEASE", Const, 0, ""},
 10807  		{"BPF_RET", Const, 0, ""},
 10808  		{"BPF_RSH", Const, 0, ""},
 10809  		{"BPF_ST", Const, 0, ""},
 10810  		{"BPF_STX", Const, 0, ""},
 10811  		{"BPF_SUB", Const, 0, ""},
 10812  		{"BPF_TAX", Const, 0, ""},
 10813  		{"BPF_TXA", Const, 0, ""},
 10814  		{"BPF_T_BINTIME", Const, 1, ""},
 10815  		{"BPF_T_BINTIME_FAST", Const, 1, ""},
 10816  		{"BPF_T_BINTIME_MONOTONIC", Const, 1, ""},
 10817  		{"BPF_T_BINTIME_MONOTONIC_FAST", Const, 1, ""},
 10818  		{"BPF_T_FAST", Const, 1, ""},
 10819  		{"BPF_T_FLAG_MASK", Const, 1, ""},
 10820  		{"BPF_T_FORMAT_MASK", Const, 1, ""},
 10821  		{"BPF_T_MICROTIME", Const, 1, ""},
 10822  		{"BPF_T_MICROTIME_FAST", Const, 1, ""},
 10823  		{"BPF_T_MICROTIME_MONOTONIC", Const, 1, ""},
 10824  		{"BPF_T_MICROTIME_MONOTONIC_FAST", Const, 1, ""},
 10825  		{"BPF_T_MONOTONIC", Const, 1, ""},
 10826  		{"BPF_T_MONOTONIC_FAST", Const, 1, ""},
 10827  		{"BPF_T_NANOTIME", Const, 1, ""},
 10828  		{"BPF_T_NANOTIME_FAST", Const, 1, ""},
 10829  		{"BPF_T_NANOTIME_MONOTONIC", Const, 1, ""},
 10830  		{"BPF_T_NANOTIME_MONOTONIC_FAST", Const, 1, ""},
 10831  		{"BPF_T_NONE", Const, 1, ""},
 10832  		{"BPF_T_NORMAL", Const, 1, ""},
 10833  		{"BPF_W", Const, 0, ""},
 10834  		{"BPF_X", Const, 0, ""},
 10835  		{"BRKINT", Const, 0, ""},
 10836  		{"Bind", Func, 0, "func(fd int, sa Sockaddr) (err error)"},
 10837  		{"BindToDevice", Func, 0, "func(fd int, device string) (err error)"},
 10838  		{"BpfBuflen", Func, 0, ""},
 10839  		{"BpfDatalink", Func, 0, ""},
 10840  		{"BpfHdr", Type, 0, ""},
 10841  		{"BpfHdr.Caplen", Field, 0, ""},
 10842  		{"BpfHdr.Datalen", Field, 0, ""},
 10843  		{"BpfHdr.Hdrlen", Field, 0, ""},
 10844  		{"BpfHdr.Pad_cgo_0", Field, 0, ""},
 10845  		{"BpfHdr.Tstamp", Field, 0, ""},
 10846  		{"BpfHeadercmpl", Func, 0, ""},
 10847  		{"BpfInsn", Type, 0, ""},
 10848  		{"BpfInsn.Code", Field, 0, ""},
 10849  		{"BpfInsn.Jf", Field, 0, ""},
 10850  		{"BpfInsn.Jt", Field, 0, ""},
 10851  		{"BpfInsn.K", Field, 0, ""},
 10852  		{"BpfInterface", Func, 0, ""},
 10853  		{"BpfJump", Func, 0, ""},
 10854  		{"BpfProgram", Type, 0, ""},
 10855  		{"BpfProgram.Insns", Field, 0, ""},
 10856  		{"BpfProgram.Len", Field, 0, ""},
 10857  		{"BpfProgram.Pad_cgo_0", Field, 0, ""},
 10858  		{"BpfStat", Type, 0, ""},
 10859  		{"BpfStat.Capt", Field, 2, ""},
 10860  		{"BpfStat.Drop", Field, 0, ""},
 10861  		{"BpfStat.Padding", Field, 2, ""},
 10862  		{"BpfStat.Recv", Field, 0, ""},
 10863  		{"BpfStats", Func, 0, ""},
 10864  		{"BpfStmt", Func, 0, ""},
 10865  		{"BpfTimeout", Func, 0, ""},
 10866  		{"BpfTimeval", Type, 2, ""},
 10867  		{"BpfTimeval.Sec", Field, 2, ""},
 10868  		{"BpfTimeval.Usec", Field, 2, ""},
 10869  		{"BpfVersion", Type, 0, ""},
 10870  		{"BpfVersion.Major", Field, 0, ""},
 10871  		{"BpfVersion.Minor", Field, 0, ""},
 10872  		{"BpfZbuf", Type, 0, ""},
 10873  		{"BpfZbuf.Bufa", Field, 0, ""},
 10874  		{"BpfZbuf.Bufb", Field, 0, ""},
 10875  		{"BpfZbuf.Buflen", Field, 0, ""},
 10876  		{"BpfZbufHeader", Type, 0, ""},
 10877  		{"BpfZbufHeader.Kernel_gen", Field, 0, ""},
 10878  		{"BpfZbufHeader.Kernel_len", Field, 0, ""},
 10879  		{"BpfZbufHeader.User_gen", Field, 0, ""},
 10880  		{"BpfZbufHeader.X_bzh_pad", Field, 0, ""},
 10881  		{"ByHandleFileInformation", Type, 0, ""},
 10882  		{"ByHandleFileInformation.CreationTime", Field, 0, ""},
 10883  		{"ByHandleFileInformation.FileAttributes", Field, 0, ""},
 10884  		{"ByHandleFileInformation.FileIndexHigh", Field, 0, ""},
 10885  		{"ByHandleFileInformation.FileIndexLow", Field, 0, ""},
 10886  		{"ByHandleFileInformation.FileSizeHigh", Field, 0, ""},
 10887  		{"ByHandleFileInformation.FileSizeLow", Field, 0, ""},
 10888  		{"ByHandleFileInformation.LastAccessTime", Field, 0, ""},
 10889  		{"ByHandleFileInformation.LastWriteTime", Field, 0, ""},
 10890  		{"ByHandleFileInformation.NumberOfLinks", Field, 0, ""},
 10891  		{"ByHandleFileInformation.VolumeSerialNumber", Field, 0, ""},
 10892  		{"BytePtrFromString", Func, 1, "func(s string) (*byte, error)"},
 10893  		{"ByteSliceFromString", Func, 1, "func(s string) ([]byte, error)"},
 10894  		{"CCR0_FLUSH", Const, 1, ""},
 10895  		{"CERT_CHAIN_POLICY_AUTHENTICODE", Const, 0, ""},
 10896  		{"CERT_CHAIN_POLICY_AUTHENTICODE_TS", Const, 0, ""},
 10897  		{"CERT_CHAIN_POLICY_BASE", Const, 0, ""},
 10898  		{"CERT_CHAIN_POLICY_BASIC_CONSTRAINTS", Const, 0, ""},
 10899  		{"CERT_CHAIN_POLICY_EV", Const, 0, ""},
 10900  		{"CERT_CHAIN_POLICY_MICROSOFT_ROOT", Const, 0, ""},
 10901  		{"CERT_CHAIN_POLICY_NT_AUTH", Const, 0, ""},
 10902  		{"CERT_CHAIN_POLICY_SSL", Const, 0, ""},
 10903  		{"CERT_E_CN_NO_MATCH", Const, 0, ""},
 10904  		{"CERT_E_EXPIRED", Const, 0, ""},
 10905  		{"CERT_E_PURPOSE", Const, 0, ""},
 10906  		{"CERT_E_ROLE", Const, 0, ""},
 10907  		{"CERT_E_UNTRUSTEDROOT", Const, 0, ""},
 10908  		{"CERT_STORE_ADD_ALWAYS", Const, 0, ""},
 10909  		{"CERT_STORE_DEFER_CLOSE_UNTIL_LAST_FREE_FLAG", Const, 0, ""},
 10910  		{"CERT_STORE_PROV_MEMORY", Const, 0, ""},
 10911  		{"CERT_TRUST_HAS_EXCLUDED_NAME_CONSTRAINT", Const, 0, ""},
 10912  		{"CERT_TRUST_HAS_NOT_DEFINED_NAME_CONSTRAINT", Const, 0, ""},
 10913  		{"CERT_TRUST_HAS_NOT_PERMITTED_NAME_CONSTRAINT", Const, 0, ""},
 10914  		{"CERT_TRUST_HAS_NOT_SUPPORTED_CRITICAL_EXT", Const, 0, ""},
 10915  		{"CERT_TRUST_HAS_NOT_SUPPORTED_NAME_CONSTRAINT", Const, 0, ""},
 10916  		{"CERT_TRUST_INVALID_BASIC_CONSTRAINTS", Const, 0, ""},
 10917  		{"CERT_TRUST_INVALID_EXTENSION", Const, 0, ""},
 10918  		{"CERT_TRUST_INVALID_NAME_CONSTRAINTS", Const, 0, ""},
 10919  		{"CERT_TRUST_INVALID_POLICY_CONSTRAINTS", Const, 0, ""},
 10920  		{"CERT_TRUST_IS_CYCLIC", Const, 0, ""},
 10921  		{"CERT_TRUST_IS_EXPLICIT_DISTRUST", Const, 0, ""},
 10922  		{"CERT_TRUST_IS_NOT_SIGNATURE_VALID", Const, 0, ""},
 10923  		{"CERT_TRUST_IS_NOT_TIME_VALID", Const, 0, ""},
 10924  		{"CERT_TRUST_IS_NOT_VALID_FOR_USAGE", Const, 0, ""},
 10925  		{"CERT_TRUST_IS_OFFLINE_REVOCATION", Const, 0, ""},
 10926  		{"CERT_TRUST_IS_REVOKED", Const, 0, ""},
 10927  		{"CERT_TRUST_IS_UNTRUSTED_ROOT", Const, 0, ""},
 10928  		{"CERT_TRUST_NO_ERROR", Const, 0, ""},
 10929  		{"CERT_TRUST_NO_ISSUANCE_CHAIN_POLICY", Const, 0, ""},
 10930  		{"CERT_TRUST_REVOCATION_STATUS_UNKNOWN", Const, 0, ""},
 10931  		{"CFLUSH", Const, 1, ""},
 10932  		{"CLOCAL", Const, 0, ""},
 10933  		{"CLONE_CHILD_CLEARTID", Const, 2, ""},
 10934  		{"CLONE_CHILD_SETTID", Const, 2, ""},
 10935  		{"CLONE_CLEAR_SIGHAND", Const, 20, ""},
 10936  		{"CLONE_CSIGNAL", Const, 3, ""},
 10937  		{"CLONE_DETACHED", Const, 2, ""},
 10938  		{"CLONE_FILES", Const, 2, ""},
 10939  		{"CLONE_FS", Const, 2, ""},
 10940  		{"CLONE_INTO_CGROUP", Const, 20, ""},
 10941  		{"CLONE_IO", Const, 2, ""},
 10942  		{"CLONE_NEWCGROUP", Const, 20, ""},
 10943  		{"CLONE_NEWIPC", Const, 2, ""},
 10944  		{"CLONE_NEWNET", Const, 2, ""},
 10945  		{"CLONE_NEWNS", Const, 2, ""},
 10946  		{"CLONE_NEWPID", Const, 2, ""},
 10947  		{"CLONE_NEWTIME", Const, 20, ""},
 10948  		{"CLONE_NEWUSER", Const, 2, ""},
 10949  		{"CLONE_NEWUTS", Const, 2, ""},
 10950  		{"CLONE_PARENT", Const, 2, ""},
 10951  		{"CLONE_PARENT_SETTID", Const, 2, ""},
 10952  		{"CLONE_PID", Const, 3, ""},
 10953  		{"CLONE_PIDFD", Const, 20, ""},
 10954  		{"CLONE_PTRACE", Const, 2, ""},
 10955  		{"CLONE_SETTLS", Const, 2, ""},
 10956  		{"CLONE_SIGHAND", Const, 2, ""},
 10957  		{"CLONE_SYSVSEM", Const, 2, ""},
 10958  		{"CLONE_THREAD", Const, 2, ""},
 10959  		{"CLONE_UNTRACED", Const, 2, ""},
 10960  		{"CLONE_VFORK", Const, 2, ""},
 10961  		{"CLONE_VM", Const, 2, ""},
 10962  		{"CPUID_CFLUSH", Const, 1, ""},
 10963  		{"CREAD", Const, 0, ""},
 10964  		{"CREATE_ALWAYS", Const, 0, ""},
 10965  		{"CREATE_NEW", Const, 0, ""},
 10966  		{"CREATE_NEW_PROCESS_GROUP", Const, 1, ""},
 10967  		{"CREATE_UNICODE_ENVIRONMENT", Const, 0, ""},
 10968  		{"CRYPT_DEFAULT_CONTAINER_OPTIONAL", Const, 0, ""},
 10969  		{"CRYPT_DELETEKEYSET", Const, 0, ""},
 10970  		{"CRYPT_MACHINE_KEYSET", Const, 0, ""},
 10971  		{"CRYPT_NEWKEYSET", Const, 0, ""},
 10972  		{"CRYPT_SILENT", Const, 0, ""},
 10973  		{"CRYPT_VERIFYCONTEXT", Const, 0, ""},
 10974  		{"CS5", Const, 0, ""},
 10975  		{"CS6", Const, 0, ""},
 10976  		{"CS7", Const, 0, ""},
 10977  		{"CS8", Const, 0, ""},
 10978  		{"CSIZE", Const, 0, ""},
 10979  		{"CSTART", Const, 1, ""},
 10980  		{"CSTATUS", Const, 1, ""},
 10981  		{"CSTOP", Const, 1, ""},
 10982  		{"CSTOPB", Const, 0, ""},
 10983  		{"CSUSP", Const, 1, ""},
 10984  		{"CTL_MAXNAME", Const, 0, ""},
 10985  		{"CTL_NET", Const, 0, ""},
 10986  		{"CTL_QUERY", Const, 1, ""},
 10987  		{"CTRL_BREAK_EVENT", Const, 1, ""},
 10988  		{"CTRL_CLOSE_EVENT", Const, 14, ""},
 10989  		{"CTRL_C_EVENT", Const, 1, ""},
 10990  		{"CTRL_LOGOFF_EVENT", Const, 14, ""},
 10991  		{"CTRL_SHUTDOWN_EVENT", Const, 14, ""},
 10992  		{"CancelIo", Func, 0, ""},
 10993  		{"CancelIoEx", Func, 1, ""},
 10994  		{"CertAddCertificateContextToStore", Func, 0, ""},
 10995  		{"CertChainContext", Type, 0, ""},
 10996  		{"CertChainContext.ChainCount", Field, 0, ""},
 10997  		{"CertChainContext.Chains", Field, 0, ""},
 10998  		{"CertChainContext.HasRevocationFreshnessTime", Field, 0, ""},
 10999  		{"CertChainContext.LowerQualityChainCount", Field, 0, ""},
 11000  		{"CertChainContext.LowerQualityChains", Field, 0, ""},
 11001  		{"CertChainContext.RevocationFreshnessTime", Field, 0, ""},
 11002  		{"CertChainContext.Size", Field, 0, ""},
 11003  		{"CertChainContext.TrustStatus", Field, 0, ""},
 11004  		{"CertChainElement", Type, 0, ""},
 11005  		{"CertChainElement.ApplicationUsage", Field, 0, ""},
 11006  		{"CertChainElement.CertContext", Field, 0, ""},
 11007  		{"CertChainElement.ExtendedErrorInfo", Field, 0, ""},
 11008  		{"CertChainElement.IssuanceUsage", Field, 0, ""},
 11009  		{"CertChainElement.RevocationInfo", Field, 0, ""},
 11010  		{"CertChainElement.Size", Field, 0, ""},
 11011  		{"CertChainElement.TrustStatus", Field, 0, ""},
 11012  		{"CertChainPara", Type, 0, ""},
 11013  		{"CertChainPara.CacheResync", Field, 0, ""},
 11014  		{"CertChainPara.CheckRevocationFreshnessTime", Field, 0, ""},
 11015  		{"CertChainPara.RequestedUsage", Field, 0, ""},
 11016  		{"CertChainPara.RequstedIssuancePolicy", Field, 0, ""},
 11017  		{"CertChainPara.RevocationFreshnessTime", Field, 0, ""},
 11018  		{"CertChainPara.Size", Field, 0, ""},
 11019  		{"CertChainPara.URLRetrievalTimeout", Field, 0, ""},
 11020  		{"CertChainPolicyPara", Type, 0, ""},
 11021  		{"CertChainPolicyPara.ExtraPolicyPara", Field, 0, ""},
 11022  		{"CertChainPolicyPara.Flags", Field, 0, ""},
 11023  		{"CertChainPolicyPara.Size", Field, 0, ""},
 11024  		{"CertChainPolicyStatus", Type, 0, ""},
 11025  		{"CertChainPolicyStatus.ChainIndex", Field, 0, ""},
 11026  		{"CertChainPolicyStatus.ElementIndex", Field, 0, ""},
 11027  		{"CertChainPolicyStatus.Error", Field, 0, ""},
 11028  		{"CertChainPolicyStatus.ExtraPolicyStatus", Field, 0, ""},
 11029  		{"CertChainPolicyStatus.Size", Field, 0, ""},
 11030  		{"CertCloseStore", Func, 0, ""},
 11031  		{"CertContext", Type, 0, ""},
 11032  		{"CertContext.CertInfo", Field, 0, ""},
 11033  		{"CertContext.EncodedCert", Field, 0, ""},
 11034  		{"CertContext.EncodingType", Field, 0, ""},
 11035  		{"CertContext.Length", Field, 0, ""},
 11036  		{"CertContext.Store", Field, 0, ""},
 11037  		{"CertCreateCertificateContext", Func, 0, ""},
 11038  		{"CertEnhKeyUsage", Type, 0, ""},
 11039  		{"CertEnhKeyUsage.Length", Field, 0, ""},
 11040  		{"CertEnhKeyUsage.UsageIdentifiers", Field, 0, ""},
 11041  		{"CertEnumCertificatesInStore", Func, 0, ""},
 11042  		{"CertFreeCertificateChain", Func, 0, ""},
 11043  		{"CertFreeCertificateContext", Func, 0, ""},
 11044  		{"CertGetCertificateChain", Func, 0, ""},
 11045  		{"CertInfo", Type, 11, ""},
 11046  		{"CertOpenStore", Func, 0, ""},
 11047  		{"CertOpenSystemStore", Func, 0, ""},
 11048  		{"CertRevocationCrlInfo", Type, 11, ""},
 11049  		{"CertRevocationInfo", Type, 0, ""},
 11050  		{"CertRevocationInfo.CrlInfo", Field, 0, ""},
 11051  		{"CertRevocationInfo.FreshnessTime", Field, 0, ""},
 11052  		{"CertRevocationInfo.HasFreshnessTime", Field, 0, ""},
 11053  		{"CertRevocationInfo.OidSpecificInfo", Field, 0, ""},
 11054  		{"CertRevocationInfo.RevocationOid", Field, 0, ""},
 11055  		{"CertRevocationInfo.RevocationResult", Field, 0, ""},
 11056  		{"CertRevocationInfo.Size", Field, 0, ""},
 11057  		{"CertSimpleChain", Type, 0, ""},
 11058  		{"CertSimpleChain.Elements", Field, 0, ""},
 11059  		{"CertSimpleChain.HasRevocationFreshnessTime", Field, 0, ""},
 11060  		{"CertSimpleChain.NumElements", Field, 0, ""},
 11061  		{"CertSimpleChain.RevocationFreshnessTime", Field, 0, ""},
 11062  		{"CertSimpleChain.Size", Field, 0, ""},
 11063  		{"CertSimpleChain.TrustListInfo", Field, 0, ""},
 11064  		{"CertSimpleChain.TrustStatus", Field, 0, ""},
 11065  		{"CertTrustListInfo", Type, 11, ""},
 11066  		{"CertTrustStatus", Type, 0, ""},
 11067  		{"CertTrustStatus.ErrorStatus", Field, 0, ""},
 11068  		{"CertTrustStatus.InfoStatus", Field, 0, ""},
 11069  		{"CertUsageMatch", Type, 0, ""},
 11070  		{"CertUsageMatch.Type", Field, 0, ""},
 11071  		{"CertUsageMatch.Usage", Field, 0, ""},
 11072  		{"CertVerifyCertificateChainPolicy", Func, 0, ""},
 11073  		{"Chdir", Func, 0, "func(path string) (err error)"},
 11074  		{"CheckBpfVersion", Func, 0, ""},
 11075  		{"Chflags", Func, 0, ""},
 11076  		{"Chmod", Func, 0, "func(path string, mode uint32) (err error)"},
 11077  		{"Chown", Func, 0, "func(path string, uid int, gid int) (err error)"},
 11078  		{"Chroot", Func, 0, "func(path string) (err error)"},
 11079  		{"Clearenv", Func, 0, "func()"},
 11080  		{"Close", Func, 0, "func(fd int) (err error)"},
 11081  		{"CloseHandle", Func, 0, ""},
 11082  		{"CloseOnExec", Func, 0, "func(fd int)"},
 11083  		{"Closesocket", Func, 0, ""},
 11084  		{"CmsgLen", Func, 0, "func(datalen int) int"},
 11085  		{"CmsgSpace", Func, 0, "func(datalen int) int"},
 11086  		{"Cmsghdr", Type, 0, ""},
 11087  		{"Cmsghdr.Len", Field, 0, ""},
 11088  		{"Cmsghdr.Level", Field, 0, ""},
 11089  		{"Cmsghdr.Type", Field, 0, ""},
 11090  		{"Cmsghdr.X__cmsg_data", Field, 0, ""},
 11091  		{"CommandLineToArgv", Func, 0, ""},
 11092  		{"ComputerName", Func, 0, ""},
 11093  		{"Conn", Type, 9, ""},
 11094  		{"Connect", Func, 0, "func(fd int, sa Sockaddr) (err error)"},
 11095  		{"ConnectEx", Func, 1, ""},
 11096  		{"ConvertSidToStringSid", Func, 0, ""},
 11097  		{"ConvertStringSidToSid", Func, 0, ""},
 11098  		{"CopySid", Func, 0, ""},
 11099  		{"Creat", Func, 0, "func(path string, mode uint32) (fd int, err error)"},
 11100  		{"CreateDirectory", Func, 0, ""},
 11101  		{"CreateFile", Func, 0, ""},
 11102  		{"CreateFileMapping", Func, 0, ""},
 11103  		{"CreateHardLink", Func, 4, ""},
 11104  		{"CreateIoCompletionPort", Func, 0, ""},
 11105  		{"CreatePipe", Func, 0, ""},
 11106  		{"CreateProcess", Func, 0, ""},
 11107  		{"CreateProcessAsUser", Func, 10, ""},
 11108  		{"CreateSymbolicLink", Func, 4, ""},
 11109  		{"CreateToolhelp32Snapshot", Func, 4, ""},
 11110  		{"Credential", Type, 0, ""},
 11111  		{"Credential.Gid", Field, 0, ""},
 11112  		{"Credential.Groups", Field, 0, ""},
 11113  		{"Credential.NoSetGroups", Field, 9, ""},
 11114  		{"Credential.Uid", Field, 0, ""},
 11115  		{"CryptAcquireContext", Func, 0, ""},
 11116  		{"CryptGenRandom", Func, 0, ""},
 11117  		{"CryptReleaseContext", Func, 0, ""},
 11118  		{"DIOCBSFLUSH", Const, 1, ""},
 11119  		{"DIOCOSFPFLUSH", Const, 1, ""},
 11120  		{"DLL", Type, 0, ""},
 11121  		{"DLL.Handle", Field, 0, ""},
 11122  		{"DLL.Name", Field, 0, ""},
 11123  		{"DLLError", Type, 0, ""},
 11124  		{"DLLError.Err", Field, 0, ""},
 11125  		{"DLLError.Msg", Field, 0, ""},
 11126  		{"DLLError.ObjName", Field, 0, ""},
 11127  		{"DLT_A429", Const, 0, ""},
 11128  		{"DLT_A653_ICM", Const, 0, ""},
 11129  		{"DLT_AIRONET_HEADER", Const, 0, ""},
 11130  		{"DLT_AOS", Const, 1, ""},
 11131  		{"DLT_APPLE_IP_OVER_IEEE1394", Const, 0, ""},
 11132  		{"DLT_ARCNET", Const, 0, ""},
 11133  		{"DLT_ARCNET_LINUX", Const, 0, ""},
 11134  		{"DLT_ATM_CLIP", Const, 0, ""},
 11135  		{"DLT_ATM_RFC1483", Const, 0, ""},
 11136  		{"DLT_AURORA", Const, 0, ""},
 11137  		{"DLT_AX25", Const, 0, ""},
 11138  		{"DLT_AX25_KISS", Const, 0, ""},
 11139  		{"DLT_BACNET_MS_TP", Const, 0, ""},
 11140  		{"DLT_BLUETOOTH_HCI_H4", Const, 0, ""},
 11141  		{"DLT_BLUETOOTH_HCI_H4_WITH_PHDR", Const, 0, ""},
 11142  		{"DLT_CAN20B", Const, 0, ""},
 11143  		{"DLT_CAN_SOCKETCAN", Const, 1, ""},
 11144  		{"DLT_CHAOS", Const, 0, ""},
 11145  		{"DLT_CHDLC", Const, 0, ""},
 11146  		{"DLT_CISCO_IOS", Const, 0, ""},
 11147  		{"DLT_C_HDLC", Const, 0, ""},
 11148  		{"DLT_C_HDLC_WITH_DIR", Const, 0, ""},
 11149  		{"DLT_DBUS", Const, 1, ""},
 11150  		{"DLT_DECT", Const, 1, ""},
 11151  		{"DLT_DOCSIS", Const, 0, ""},
 11152  		{"DLT_DVB_CI", Const, 1, ""},
 11153  		{"DLT_ECONET", Const, 0, ""},
 11154  		{"DLT_EN10MB", Const, 0, ""},
 11155  		{"DLT_EN3MB", Const, 0, ""},
 11156  		{"DLT_ENC", Const, 0, ""},
 11157  		{"DLT_ERF", Const, 0, ""},
 11158  		{"DLT_ERF_ETH", Const, 0, ""},
 11159  		{"DLT_ERF_POS", Const, 0, ""},
 11160  		{"DLT_FC_2", Const, 1, ""},
 11161  		{"DLT_FC_2_WITH_FRAME_DELIMS", Const, 1, ""},
 11162  		{"DLT_FDDI", Const, 0, ""},
 11163  		{"DLT_FLEXRAY", Const, 0, ""},
 11164  		{"DLT_FRELAY", Const, 0, ""},
 11165  		{"DLT_FRELAY_WITH_DIR", Const, 0, ""},
 11166  		{"DLT_GCOM_SERIAL", Const, 0, ""},
 11167  		{"DLT_GCOM_T1E1", Const, 0, ""},
 11168  		{"DLT_GPF_F", Const, 0, ""},
 11169  		{"DLT_GPF_T", Const, 0, ""},
 11170  		{"DLT_GPRS_LLC", Const, 0, ""},
 11171  		{"DLT_GSMTAP_ABIS", Const, 1, ""},
 11172  		{"DLT_GSMTAP_UM", Const, 1, ""},
 11173  		{"DLT_HDLC", Const, 1, ""},
 11174  		{"DLT_HHDLC", Const, 0, ""},
 11175  		{"DLT_HIPPI", Const, 1, ""},
 11176  		{"DLT_IBM_SN", Const, 0, ""},
 11177  		{"DLT_IBM_SP", Const, 0, ""},
 11178  		{"DLT_IEEE802", Const, 0, ""},
 11179  		{"DLT_IEEE802_11", Const, 0, ""},
 11180  		{"DLT_IEEE802_11_RADIO", Const, 0, ""},
 11181  		{"DLT_IEEE802_11_RADIO_AVS", Const, 0, ""},
 11182  		{"DLT_IEEE802_15_4", Const, 0, ""},
 11183  		{"DLT_IEEE802_15_4_LINUX", Const, 0, ""},
 11184  		{"DLT_IEEE802_15_4_NOFCS", Const, 1, ""},
 11185  		{"DLT_IEEE802_15_4_NONASK_PHY", Const, 0, ""},
 11186  		{"DLT_IEEE802_16_MAC_CPS", Const, 0, ""},
 11187  		{"DLT_IEEE802_16_MAC_CPS_RADIO", Const, 0, ""},
 11188  		{"DLT_IPFILTER", Const, 0, ""},
 11189  		{"DLT_IPMB", Const, 0, ""},
 11190  		{"DLT_IPMB_LINUX", Const, 0, ""},
 11191  		{"DLT_IPNET", Const, 1, ""},
 11192  		{"DLT_IPOIB", Const, 1, ""},
 11193  		{"DLT_IPV4", Const, 1, ""},
 11194  		{"DLT_IPV6", Const, 1, ""},
 11195  		{"DLT_IP_OVER_FC", Const, 0, ""},
 11196  		{"DLT_JUNIPER_ATM1", Const, 0, ""},
 11197  		{"DLT_JUNIPER_ATM2", Const, 0, ""},
 11198  		{"DLT_JUNIPER_ATM_CEMIC", Const, 1, ""},
 11199  		{"DLT_JUNIPER_CHDLC", Const, 0, ""},
 11200  		{"DLT_JUNIPER_ES", Const, 0, ""},
 11201  		{"DLT_JUNIPER_ETHER", Const, 0, ""},
 11202  		{"DLT_JUNIPER_FIBRECHANNEL", Const, 1, ""},
 11203  		{"DLT_JUNIPER_FRELAY", Const, 0, ""},
 11204  		{"DLT_JUNIPER_GGSN", Const, 0, ""},
 11205  		{"DLT_JUNIPER_ISM", Const, 0, ""},
 11206  		{"DLT_JUNIPER_MFR", Const, 0, ""},
 11207  		{"DLT_JUNIPER_MLFR", Const, 0, ""},
 11208  		{"DLT_JUNIPER_MLPPP", Const, 0, ""},
 11209  		{"DLT_JUNIPER_MONITOR", Const, 0, ""},
 11210  		{"DLT_JUNIPER_PIC_PEER", Const, 0, ""},
 11211  		{"DLT_JUNIPER_PPP", Const, 0, ""},
 11212  		{"DLT_JUNIPER_PPPOE", Const, 0, ""},
 11213  		{"DLT_JUNIPER_PPPOE_ATM", Const, 0, ""},
 11214  		{"DLT_JUNIPER_SERVICES", Const, 0, ""},
 11215  		{"DLT_JUNIPER_SRX_E2E", Const, 1, ""},
 11216  		{"DLT_JUNIPER_ST", Const, 0, ""},
 11217  		{"DLT_JUNIPER_VP", Const, 0, ""},
 11218  		{"DLT_JUNIPER_VS", Const, 1, ""},
 11219  		{"DLT_LAPB_WITH_DIR", Const, 0, ""},
 11220  		{"DLT_LAPD", Const, 0, ""},
 11221  		{"DLT_LIN", Const, 0, ""},
 11222  		{"DLT_LINUX_EVDEV", Const, 1, ""},
 11223  		{"DLT_LINUX_IRDA", Const, 0, ""},
 11224  		{"DLT_LINUX_LAPD", Const, 0, ""},
 11225  		{"DLT_LINUX_PPP_WITHDIRECTION", Const, 0, ""},
 11226  		{"DLT_LINUX_SLL", Const, 0, ""},
 11227  		{"DLT_LOOP", Const, 0, ""},
 11228  		{"DLT_LTALK", Const, 0, ""},
 11229  		{"DLT_MATCHING_MAX", Const, 1, ""},
 11230  		{"DLT_MATCHING_MIN", Const, 1, ""},
 11231  		{"DLT_MFR", Const, 0, ""},
 11232  		{"DLT_MOST", Const, 0, ""},
 11233  		{"DLT_MPEG_2_TS", Const, 1, ""},
 11234  		{"DLT_MPLS", Const, 1, ""},
 11235  		{"DLT_MTP2", Const, 0, ""},
 11236  		{"DLT_MTP2_WITH_PHDR", Const, 0, ""},
 11237  		{"DLT_MTP3", Const, 0, ""},
 11238  		{"DLT_MUX27010", Const, 1, ""},
 11239  		{"DLT_NETANALYZER", Const, 1, ""},
 11240  		{"DLT_NETANALYZER_TRANSPARENT", Const, 1, ""},
 11241  		{"DLT_NFC_LLCP", Const, 1, ""},
 11242  		{"DLT_NFLOG", Const, 1, ""},
 11243  		{"DLT_NG40", Const, 1, ""},
 11244  		{"DLT_NULL", Const, 0, ""},
 11245  		{"DLT_PCI_EXP", Const, 0, ""},
 11246  		{"DLT_PFLOG", Const, 0, ""},
 11247  		{"DLT_PFSYNC", Const, 0, ""},
 11248  		{"DLT_PPI", Const, 0, ""},
 11249  		{"DLT_PPP", Const, 0, ""},
 11250  		{"DLT_PPP_BSDOS", Const, 0, ""},
 11251  		{"DLT_PPP_ETHER", Const, 0, ""},
 11252  		{"DLT_PPP_PPPD", Const, 0, ""},
 11253  		{"DLT_PPP_SERIAL", Const, 0, ""},
 11254  		{"DLT_PPP_WITH_DIR", Const, 0, ""},
 11255  		{"DLT_PPP_WITH_DIRECTION", Const, 0, ""},
 11256  		{"DLT_PRISM_HEADER", Const, 0, ""},
 11257  		{"DLT_PRONET", Const, 0, ""},
 11258  		{"DLT_RAIF1", Const, 0, ""},
 11259  		{"DLT_RAW", Const, 0, ""},
 11260  		{"DLT_RAWAF_MASK", Const, 1, ""},
 11261  		{"DLT_RIO", Const, 0, ""},
 11262  		{"DLT_SCCP", Const, 0, ""},
 11263  		{"DLT_SITA", Const, 0, ""},
 11264  		{"DLT_SLIP", Const, 0, ""},
 11265  		{"DLT_SLIP_BSDOS", Const, 0, ""},
 11266  		{"DLT_STANAG_5066_D_PDU", Const, 1, ""},
 11267  		{"DLT_SUNATM", Const, 0, ""},
 11268  		{"DLT_SYMANTEC_FIREWALL", Const, 0, ""},
 11269  		{"DLT_TZSP", Const, 0, ""},
 11270  		{"DLT_USB", Const, 0, ""},
 11271  		{"DLT_USB_LINUX", Const, 0, ""},
 11272  		{"DLT_USB_LINUX_MMAPPED", Const, 1, ""},
 11273  		{"DLT_USER0", Const, 0, ""},
 11274  		{"DLT_USER1", Const, 0, ""},
 11275  		{"DLT_USER10", Const, 0, ""},
 11276  		{"DLT_USER11", Const, 0, ""},
 11277  		{"DLT_USER12", Const, 0, ""},
 11278  		{"DLT_USER13", Const, 0, ""},
 11279  		{"DLT_USER14", Const, 0, ""},
 11280  		{"DLT_USER15", Const, 0, ""},
 11281  		{"DLT_USER2", Const, 0, ""},
 11282  		{"DLT_USER3", Const, 0, ""},
 11283  		{"DLT_USER4", Const, 0, ""},
 11284  		{"DLT_USER5", Const, 0, ""},
 11285  		{"DLT_USER6", Const, 0, ""},
 11286  		{"DLT_USER7", Const, 0, ""},
 11287  		{"DLT_USER8", Const, 0, ""},
 11288  		{"DLT_USER9", Const, 0, ""},
 11289  		{"DLT_WIHART", Const, 1, ""},
 11290  		{"DLT_X2E_SERIAL", Const, 0, ""},
 11291  		{"DLT_X2E_XORAYA", Const, 0, ""},
 11292  		{"DNSMXData", Type, 0, ""},
 11293  		{"DNSMXData.NameExchange", Field, 0, ""},
 11294  		{"DNSMXData.Pad", Field, 0, ""},
 11295  		{"DNSMXData.Preference", Field, 0, ""},
 11296  		{"DNSPTRData", Type, 0, ""},
 11297  		{"DNSPTRData.Host", Field, 0, ""},
 11298  		{"DNSRecord", Type, 0, ""},
 11299  		{"DNSRecord.Data", Field, 0, ""},
 11300  		{"DNSRecord.Dw", Field, 0, ""},
 11301  		{"DNSRecord.Length", Field, 0, ""},
 11302  		{"DNSRecord.Name", Field, 0, ""},
 11303  		{"DNSRecord.Next", Field, 0, ""},
 11304  		{"DNSRecord.Reserved", Field, 0, ""},
 11305  		{"DNSRecord.Ttl", Field, 0, ""},
 11306  		{"DNSRecord.Type", Field, 0, ""},
 11307  		{"DNSSRVData", Type, 0, ""},
 11308  		{"DNSSRVData.Pad", Field, 0, ""},
 11309  		{"DNSSRVData.Port", Field, 0, ""},
 11310  		{"DNSSRVData.Priority", Field, 0, ""},
 11311  		{"DNSSRVData.Target", Field, 0, ""},
 11312  		{"DNSSRVData.Weight", Field, 0, ""},
 11313  		{"DNSTXTData", Type, 0, ""},
 11314  		{"DNSTXTData.StringArray", Field, 0, ""},
 11315  		{"DNSTXTData.StringCount", Field, 0, ""},
 11316  		{"DNS_INFO_NO_RECORDS", Const, 4, ""},
 11317  		{"DNS_TYPE_A", Const, 0, ""},
 11318  		{"DNS_TYPE_A6", Const, 0, ""},
 11319  		{"DNS_TYPE_AAAA", Const, 0, ""},
 11320  		{"DNS_TYPE_ADDRS", Const, 0, ""},
 11321  		{"DNS_TYPE_AFSDB", Const, 0, ""},
 11322  		{"DNS_TYPE_ALL", Const, 0, ""},
 11323  		{"DNS_TYPE_ANY", Const, 0, ""},
 11324  		{"DNS_TYPE_ATMA", Const, 0, ""},
 11325  		{"DNS_TYPE_AXFR", Const, 0, ""},
 11326  		{"DNS_TYPE_CERT", Const, 0, ""},
 11327  		{"DNS_TYPE_CNAME", Const, 0, ""},
 11328  		{"DNS_TYPE_DHCID", Const, 0, ""},
 11329  		{"DNS_TYPE_DNAME", Const, 0, ""},
 11330  		{"DNS_TYPE_DNSKEY", Const, 0, ""},
 11331  		{"DNS_TYPE_DS", Const, 0, ""},
 11332  		{"DNS_TYPE_EID", Const, 0, ""},
 11333  		{"DNS_TYPE_GID", Const, 0, ""},
 11334  		{"DNS_TYPE_GPOS", Const, 0, ""},
 11335  		{"DNS_TYPE_HINFO", Const, 0, ""},
 11336  		{"DNS_TYPE_ISDN", Const, 0, ""},
 11337  		{"DNS_TYPE_IXFR", Const, 0, ""},
 11338  		{"DNS_TYPE_KEY", Const, 0, ""},
 11339  		{"DNS_TYPE_KX", Const, 0, ""},
 11340  		{"DNS_TYPE_LOC", Const, 0, ""},
 11341  		{"DNS_TYPE_MAILA", Const, 0, ""},
 11342  		{"DNS_TYPE_MAILB", Const, 0, ""},
 11343  		{"DNS_TYPE_MB", Const, 0, ""},
 11344  		{"DNS_TYPE_MD", Const, 0, ""},
 11345  		{"DNS_TYPE_MF", Const, 0, ""},
 11346  		{"DNS_TYPE_MG", Const, 0, ""},
 11347  		{"DNS_TYPE_MINFO", Const, 0, ""},
 11348  		{"DNS_TYPE_MR", Const, 0, ""},
 11349  		{"DNS_TYPE_MX", Const, 0, ""},
 11350  		{"DNS_TYPE_NAPTR", Const, 0, ""},
 11351  		{"DNS_TYPE_NBSTAT", Const, 0, ""},
 11352  		{"DNS_TYPE_NIMLOC", Const, 0, ""},
 11353  		{"DNS_TYPE_NS", Const, 0, ""},
 11354  		{"DNS_TYPE_NSAP", Const, 0, ""},
 11355  		{"DNS_TYPE_NSAPPTR", Const, 0, ""},
 11356  		{"DNS_TYPE_NSEC", Const, 0, ""},
 11357  		{"DNS_TYPE_NULL", Const, 0, ""},
 11358  		{"DNS_TYPE_NXT", Const, 0, ""},
 11359  		{"DNS_TYPE_OPT", Const, 0, ""},
 11360  		{"DNS_TYPE_PTR", Const, 0, ""},
 11361  		{"DNS_TYPE_PX", Const, 0, ""},
 11362  		{"DNS_TYPE_RP", Const, 0, ""},
 11363  		{"DNS_TYPE_RRSIG", Const, 0, ""},
 11364  		{"DNS_TYPE_RT", Const, 0, ""},
 11365  		{"DNS_TYPE_SIG", Const, 0, ""},
 11366  		{"DNS_TYPE_SINK", Const, 0, ""},
 11367  		{"DNS_TYPE_SOA", Const, 0, ""},
 11368  		{"DNS_TYPE_SRV", Const, 0, ""},
 11369  		{"DNS_TYPE_TEXT", Const, 0, ""},
 11370  		{"DNS_TYPE_TKEY", Const, 0, ""},
 11371  		{"DNS_TYPE_TSIG", Const, 0, ""},
 11372  		{"DNS_TYPE_UID", Const, 0, ""},
 11373  		{"DNS_TYPE_UINFO", Const, 0, ""},
 11374  		{"DNS_TYPE_UNSPEC", Const, 0, ""},
 11375  		{"DNS_TYPE_WINS", Const, 0, ""},
 11376  		{"DNS_TYPE_WINSR", Const, 0, ""},
 11377  		{"DNS_TYPE_WKS", Const, 0, ""},
 11378  		{"DNS_TYPE_X25", Const, 0, ""},
 11379  		{"DT_BLK", Const, 0, ""},
 11380  		{"DT_CHR", Const, 0, ""},
 11381  		{"DT_DIR", Const, 0, ""},
 11382  		{"DT_FIFO", Const, 0, ""},
 11383  		{"DT_LNK", Const, 0, ""},
 11384  		{"DT_REG", Const, 0, ""},
 11385  		{"DT_SOCK", Const, 0, ""},
 11386  		{"DT_UNKNOWN", Const, 0, ""},
 11387  		{"DT_WHT", Const, 0, ""},
 11388  		{"DUPLICATE_CLOSE_SOURCE", Const, 0, ""},
 11389  		{"DUPLICATE_SAME_ACCESS", Const, 0, ""},
 11390  		{"DeleteFile", Func, 0, ""},
 11391  		{"DetachLsf", Func, 0, "func(fd int) error"},
 11392  		{"DeviceIoControl", Func, 4, ""},
 11393  		{"Dirent", Type, 0, ""},
 11394  		{"Dirent.Fileno", Field, 0, ""},
 11395  		{"Dirent.Ino", Field, 0, ""},
 11396  		{"Dirent.Name", Field, 0, ""},
 11397  		{"Dirent.Namlen", Field, 0, ""},
 11398  		{"Dirent.Off", Field, 0, ""},
 11399  		{"Dirent.Pad0", Field, 12, ""},
 11400  		{"Dirent.Pad1", Field, 12, ""},
 11401  		{"Dirent.Pad_cgo_0", Field, 0, ""},
 11402  		{"Dirent.Reclen", Field, 0, ""},
 11403  		{"Dirent.Seekoff", Field, 0, ""},
 11404  		{"Dirent.Type", Field, 0, ""},
 11405  		{"Dirent.X__d_padding", Field, 3, ""},
 11406  		{"DnsNameCompare", Func, 4, ""},
 11407  		{"DnsQuery", Func, 0, ""},
 11408  		{"DnsRecordListFree", Func, 0, ""},
 11409  		{"DnsSectionAdditional", Const, 4, ""},
 11410  		{"DnsSectionAnswer", Const, 4, ""},
 11411  		{"DnsSectionAuthority", Const, 4, ""},
 11412  		{"DnsSectionQuestion", Const, 4, ""},
 11413  		{"Dup", Func, 0, "func(oldfd int) (fd int, err error)"},
 11414  		{"Dup2", Func, 0, "func(oldfd int, newfd int) (err error)"},
 11415  		{"Dup3", Func, 2, "func(oldfd int, newfd int, flags int) (err error)"},
 11416  		{"DuplicateHandle", Func, 0, ""},
 11417  		{"E2BIG", Const, 0, ""},
 11418  		{"EACCES", Const, 0, ""},
 11419  		{"EADDRINUSE", Const, 0, ""},
 11420  		{"EADDRNOTAVAIL", Const, 0, ""},
 11421  		{"EADV", Const, 0, ""},
 11422  		{"EAFNOSUPPORT", Const, 0, ""},
 11423  		{"EAGAIN", Const, 0, ""},
 11424  		{"EALREADY", Const, 0, ""},
 11425  		{"EAUTH", Const, 0, ""},
 11426  		{"EBADARCH", Const, 0, ""},
 11427  		{"EBADE", Const, 0, ""},
 11428  		{"EBADEXEC", Const, 0, ""},
 11429  		{"EBADF", Const, 0, ""},
 11430  		{"EBADFD", Const, 0, ""},
 11431  		{"EBADMACHO", Const, 0, ""},
 11432  		{"EBADMSG", Const, 0, ""},
 11433  		{"EBADR", Const, 0, ""},
 11434  		{"EBADRPC", Const, 0, ""},
 11435  		{"EBADRQC", Const, 0, ""},
 11436  		{"EBADSLT", Const, 0, ""},
 11437  		{"EBFONT", Const, 0, ""},
 11438  		{"EBUSY", Const, 0, ""},
 11439  		{"ECANCELED", Const, 0, ""},
 11440  		{"ECAPMODE", Const, 1, ""},
 11441  		{"ECHILD", Const, 0, ""},
 11442  		{"ECHO", Const, 0, ""},
 11443  		{"ECHOCTL", Const, 0, ""},
 11444  		{"ECHOE", Const, 0, ""},
 11445  		{"ECHOK", Const, 0, ""},
 11446  		{"ECHOKE", Const, 0, ""},
 11447  		{"ECHONL", Const, 0, ""},
 11448  		{"ECHOPRT", Const, 0, ""},
 11449  		{"ECHRNG", Const, 0, ""},
 11450  		{"ECOMM", Const, 0, ""},
 11451  		{"ECONNABORTED", Const, 0, ""},
 11452  		{"ECONNREFUSED", Const, 0, ""},
 11453  		{"ECONNRESET", Const, 0, ""},
 11454  		{"EDEADLK", Const, 0, ""},
 11455  		{"EDEADLOCK", Const, 0, ""},
 11456  		{"EDESTADDRREQ", Const, 0, ""},
 11457  		{"EDEVERR", Const, 0, ""},
 11458  		{"EDOM", Const, 0, ""},
 11459  		{"EDOOFUS", Const, 0, ""},
 11460  		{"EDOTDOT", Const, 0, ""},
 11461  		{"EDQUOT", Const, 0, ""},
 11462  		{"EEXIST", Const, 0, ""},
 11463  		{"EFAULT", Const, 0, ""},
 11464  		{"EFBIG", Const, 0, ""},
 11465  		{"EFER_LMA", Const, 1, ""},
 11466  		{"EFER_LME", Const, 1, ""},
 11467  		{"EFER_NXE", Const, 1, ""},
 11468  		{"EFER_SCE", Const, 1, ""},
 11469  		{"EFTYPE", Const, 0, ""},
 11470  		{"EHOSTDOWN", Const, 0, ""},
 11471  		{"EHOSTUNREACH", Const, 0, ""},
 11472  		{"EHWPOISON", Const, 0, ""},
 11473  		{"EIDRM", Const, 0, ""},
 11474  		{"EILSEQ", Const, 0, ""},
 11475  		{"EINPROGRESS", Const, 0, ""},
 11476  		{"EINTR", Const, 0, ""},
 11477  		{"EINVAL", Const, 0, ""},
 11478  		{"EIO", Const, 0, ""},
 11479  		{"EIPSEC", Const, 1, ""},
 11480  		{"EISCONN", Const, 0, ""},
 11481  		{"EISDIR", Const, 0, ""},
 11482  		{"EISNAM", Const, 0, ""},
 11483  		{"EKEYEXPIRED", Const, 0, ""},
 11484  		{"EKEYREJECTED", Const, 0, ""},
 11485  		{"EKEYREVOKED", Const, 0, ""},
 11486  		{"EL2HLT", Const, 0, ""},
 11487  		{"EL2NSYNC", Const, 0, ""},
 11488  		{"EL3HLT", Const, 0, ""},
 11489  		{"EL3RST", Const, 0, ""},
 11490  		{"ELAST", Const, 0, ""},
 11491  		{"ELF_NGREG", Const, 0, ""},
 11492  		{"ELF_PRARGSZ", Const, 0, ""},
 11493  		{"ELIBACC", Const, 0, ""},
 11494  		{"ELIBBAD", Const, 0, ""},
 11495  		{"ELIBEXEC", Const, 0, ""},
 11496  		{"ELIBMAX", Const, 0, ""},
 11497  		{"ELIBSCN", Const, 0, ""},
 11498  		{"ELNRNG", Const, 0, ""},
 11499  		{"ELOOP", Const, 0, ""},
 11500  		{"EMEDIUMTYPE", Const, 0, ""},
 11501  		{"EMFILE", Const, 0, ""},
 11502  		{"EMLINK", Const, 0, ""},
 11503  		{"EMSGSIZE", Const, 0, ""},
 11504  		{"EMT_TAGOVF", Const, 1, ""},
 11505  		{"EMULTIHOP", Const, 0, ""},
 11506  		{"EMUL_ENABLED", Const, 1, ""},
 11507  		{"EMUL_LINUX", Const, 1, ""},
 11508  		{"EMUL_LINUX32", Const, 1, ""},
 11509  		{"EMUL_MAXID", Const, 1, ""},
 11510  		{"EMUL_NATIVE", Const, 1, ""},
 11511  		{"ENAMETOOLONG", Const, 0, ""},
 11512  		{"ENAVAIL", Const, 0, ""},
 11513  		{"ENDRUNDISC", Const, 1, ""},
 11514  		{"ENEEDAUTH", Const, 0, ""},
 11515  		{"ENETDOWN", Const, 0, ""},
 11516  		{"ENETRESET", Const, 0, ""},
 11517  		{"ENETUNREACH", Const, 0, ""},
 11518  		{"ENFILE", Const, 0, ""},
 11519  		{"ENOANO", Const, 0, ""},
 11520  		{"ENOATTR", Const, 0, ""},
 11521  		{"ENOBUFS", Const, 0, ""},
 11522  		{"ENOCSI", Const, 0, ""},
 11523  		{"ENODATA", Const, 0, ""},
 11524  		{"ENODEV", Const, 0, ""},
 11525  		{"ENOENT", Const, 0, ""},
 11526  		{"ENOEXEC", Const, 0, ""},
 11527  		{"ENOKEY", Const, 0, ""},
 11528  		{"ENOLCK", Const, 0, ""},
 11529  		{"ENOLINK", Const, 0, ""},
 11530  		{"ENOMEDIUM", Const, 0, ""},
 11531  		{"ENOMEM", Const, 0, ""},
 11532  		{"ENOMSG", Const, 0, ""},
 11533  		{"ENONET", Const, 0, ""},
 11534  		{"ENOPKG", Const, 0, ""},
 11535  		{"ENOPOLICY", Const, 0, ""},
 11536  		{"ENOPROTOOPT", Const, 0, ""},
 11537  		{"ENOSPC", Const, 0, ""},
 11538  		{"ENOSR", Const, 0, ""},
 11539  		{"ENOSTR", Const, 0, ""},
 11540  		{"ENOSYS", Const, 0, ""},
 11541  		{"ENOTBLK", Const, 0, ""},
 11542  		{"ENOTCAPABLE", Const, 0, ""},
 11543  		{"ENOTCONN", Const, 0, ""},
 11544  		{"ENOTDIR", Const, 0, ""},
 11545  		{"ENOTEMPTY", Const, 0, ""},
 11546  		{"ENOTNAM", Const, 0, ""},
 11547  		{"ENOTRECOVERABLE", Const, 0, ""},
 11548  		{"ENOTSOCK", Const, 0, ""},
 11549  		{"ENOTSUP", Const, 0, ""},
 11550  		{"ENOTTY", Const, 0, ""},
 11551  		{"ENOTUNIQ", Const, 0, ""},
 11552  		{"ENXIO", Const, 0, ""},
 11553  		{"EN_SW_CTL_INF", Const, 1, ""},
 11554  		{"EN_SW_CTL_PREC", Const, 1, ""},
 11555  		{"EN_SW_CTL_ROUND", Const, 1, ""},
 11556  		{"EN_SW_DATACHAIN", Const, 1, ""},
 11557  		{"EN_SW_DENORM", Const, 1, ""},
 11558  		{"EN_SW_INVOP", Const, 1, ""},
 11559  		{"EN_SW_OVERFLOW", Const, 1, ""},
 11560  		{"EN_SW_PRECLOSS", Const, 1, ""},
 11561  		{"EN_SW_UNDERFLOW", Const, 1, ""},
 11562  		{"EN_SW_ZERODIV", Const, 1, ""},
 11563  		{"EOPNOTSUPP", Const, 0, ""},
 11564  		{"EOVERFLOW", Const, 0, ""},
 11565  		{"EOWNERDEAD", Const, 0, ""},
 11566  		{"EPERM", Const, 0, ""},
 11567  		{"EPFNOSUPPORT", Const, 0, ""},
 11568  		{"EPIPE", Const, 0, ""},
 11569  		{"EPOLLERR", Const, 0, ""},
 11570  		{"EPOLLET", Const, 0, ""},
 11571  		{"EPOLLHUP", Const, 0, ""},
 11572  		{"EPOLLIN", Const, 0, ""},
 11573  		{"EPOLLMSG", Const, 0, ""},
 11574  		{"EPOLLONESHOT", Const, 0, ""},
 11575  		{"EPOLLOUT", Const, 0, ""},
 11576  		{"EPOLLPRI", Const, 0, ""},
 11577  		{"EPOLLRDBAND", Const, 0, ""},
 11578  		{"EPOLLRDHUP", Const, 0, ""},
 11579  		{"EPOLLRDNORM", Const, 0, ""},
 11580  		{"EPOLLWRBAND", Const, 0, ""},
 11581  		{"EPOLLWRNORM", Const, 0, ""},
 11582  		{"EPOLL_CLOEXEC", Const, 0, ""},
 11583  		{"EPOLL_CTL_ADD", Const, 0, ""},
 11584  		{"EPOLL_CTL_DEL", Const, 0, ""},
 11585  		{"EPOLL_CTL_MOD", Const, 0, ""},
 11586  		{"EPOLL_NONBLOCK", Const, 0, ""},
 11587  		{"EPROCLIM", Const, 0, ""},
 11588  		{"EPROCUNAVAIL", Const, 0, ""},
 11589  		{"EPROGMISMATCH", Const, 0, ""},
 11590  		{"EPROGUNAVAIL", Const, 0, ""},
 11591  		{"EPROTO", Const, 0, ""},
 11592  		{"EPROTONOSUPPORT", Const, 0, ""},
 11593  		{"EPROTOTYPE", Const, 0, ""},
 11594  		{"EPWROFF", Const, 0, ""},
 11595  		{"EQFULL", Const, 16, ""},
 11596  		{"ERANGE", Const, 0, ""},
 11597  		{"EREMCHG", Const, 0, ""},
 11598  		{"EREMOTE", Const, 0, ""},
 11599  		{"EREMOTEIO", Const, 0, ""},
 11600  		{"ERESTART", Const, 0, ""},
 11601  		{"ERFKILL", Const, 0, ""},
 11602  		{"EROFS", Const, 0, ""},
 11603  		{"ERPCMISMATCH", Const, 0, ""},
 11604  		{"ERROR_ACCESS_DENIED", Const, 0, ""},
 11605  		{"ERROR_ALREADY_EXISTS", Const, 0, ""},
 11606  		{"ERROR_BROKEN_PIPE", Const, 0, ""},
 11607  		{"ERROR_BUFFER_OVERFLOW", Const, 0, ""},
 11608  		{"ERROR_DIR_NOT_EMPTY", Const, 8, ""},
 11609  		{"ERROR_ENVVAR_NOT_FOUND", Const, 0, ""},
 11610  		{"ERROR_FILE_EXISTS", Const, 0, ""},
 11611  		{"ERROR_FILE_NOT_FOUND", Const, 0, ""},
 11612  		{"ERROR_HANDLE_EOF", Const, 2, ""},
 11613  		{"ERROR_INSUFFICIENT_BUFFER", Const, 0, ""},
 11614  		{"ERROR_IO_PENDING", Const, 0, ""},
 11615  		{"ERROR_MOD_NOT_FOUND", Const, 0, ""},
 11616  		{"ERROR_MORE_DATA", Const, 3, ""},
 11617  		{"ERROR_NETNAME_DELETED", Const, 3, ""},
 11618  		{"ERROR_NOT_FOUND", Const, 1, ""},
 11619  		{"ERROR_NO_MORE_FILES", Const, 0, ""},
 11620  		{"ERROR_OPERATION_ABORTED", Const, 0, ""},
 11621  		{"ERROR_PATH_NOT_FOUND", Const, 0, ""},
 11622  		{"ERROR_PRIVILEGE_NOT_HELD", Const, 4, ""},
 11623  		{"ERROR_PROC_NOT_FOUND", Const, 0, ""},
 11624  		{"ESHLIBVERS", Const, 0, ""},
 11625  		{"ESHUTDOWN", Const, 0, ""},
 11626  		{"ESOCKTNOSUPPORT", Const, 0, ""},
 11627  		{"ESPIPE", Const, 0, ""},
 11628  		{"ESRCH", Const, 0, ""},
 11629  		{"ESRMNT", Const, 0, ""},
 11630  		{"ESTALE", Const, 0, ""},
 11631  		{"ESTRPIPE", Const, 0, ""},
 11632  		{"ETHERCAP_JUMBO_MTU", Const, 1, ""},
 11633  		{"ETHERCAP_VLAN_HWTAGGING", Const, 1, ""},
 11634  		{"ETHERCAP_VLAN_MTU", Const, 1, ""},
 11635  		{"ETHERMIN", Const, 1, ""},
 11636  		{"ETHERMTU", Const, 1, ""},
 11637  		{"ETHERMTU_JUMBO", Const, 1, ""},
 11638  		{"ETHERTYPE_8023", Const, 1, ""},
 11639  		{"ETHERTYPE_AARP", Const, 1, ""},
 11640  		{"ETHERTYPE_ACCTON", Const, 1, ""},
 11641  		{"ETHERTYPE_AEONIC", Const, 1, ""},
 11642  		{"ETHERTYPE_ALPHA", Const, 1, ""},
 11643  		{"ETHERTYPE_AMBER", Const, 1, ""},
 11644  		{"ETHERTYPE_AMOEBA", Const, 1, ""},
 11645  		{"ETHERTYPE_AOE", Const, 1, ""},
 11646  		{"ETHERTYPE_APOLLO", Const, 1, ""},
 11647  		{"ETHERTYPE_APOLLODOMAIN", Const, 1, ""},
 11648  		{"ETHERTYPE_APPLETALK", Const, 1, ""},
 11649  		{"ETHERTYPE_APPLITEK", Const, 1, ""},
 11650  		{"ETHERTYPE_ARGONAUT", Const, 1, ""},
 11651  		{"ETHERTYPE_ARP", Const, 1, ""},
 11652  		{"ETHERTYPE_AT", Const, 1, ""},
 11653  		{"ETHERTYPE_ATALK", Const, 1, ""},
 11654  		{"ETHERTYPE_ATOMIC", Const, 1, ""},
 11655  		{"ETHERTYPE_ATT", Const, 1, ""},
 11656  		{"ETHERTYPE_ATTSTANFORD", Const, 1, ""},
 11657  		{"ETHERTYPE_AUTOPHON", Const, 1, ""},
 11658  		{"ETHERTYPE_AXIS", Const, 1, ""},
 11659  		{"ETHERTYPE_BCLOOP", Const, 1, ""},
 11660  		{"ETHERTYPE_BOFL", Const, 1, ""},
 11661  		{"ETHERTYPE_CABLETRON", Const, 1, ""},
 11662  		{"ETHERTYPE_CHAOS", Const, 1, ""},
 11663  		{"ETHERTYPE_COMDESIGN", Const, 1, ""},
 11664  		{"ETHERTYPE_COMPUGRAPHIC", Const, 1, ""},
 11665  		{"ETHERTYPE_COUNTERPOINT", Const, 1, ""},
 11666  		{"ETHERTYPE_CRONUS", Const, 1, ""},
 11667  		{"ETHERTYPE_CRONUSVLN", Const, 1, ""},
 11668  		{"ETHERTYPE_DCA", Const, 1, ""},
 11669  		{"ETHERTYPE_DDE", Const, 1, ""},
 11670  		{"ETHERTYPE_DEBNI", Const, 1, ""},
 11671  		{"ETHERTYPE_DECAM", Const, 1, ""},
 11672  		{"ETHERTYPE_DECCUST", Const, 1, ""},
 11673  		{"ETHERTYPE_DECDIAG", Const, 1, ""},
 11674  		{"ETHERTYPE_DECDNS", Const, 1, ""},
 11675  		{"ETHERTYPE_DECDTS", Const, 1, ""},
 11676  		{"ETHERTYPE_DECEXPER", Const, 1, ""},
 11677  		{"ETHERTYPE_DECLAST", Const, 1, ""},
 11678  		{"ETHERTYPE_DECLTM", Const, 1, ""},
 11679  		{"ETHERTYPE_DECMUMPS", Const, 1, ""},
 11680  		{"ETHERTYPE_DECNETBIOS", Const, 1, ""},
 11681  		{"ETHERTYPE_DELTACON", Const, 1, ""},
 11682  		{"ETHERTYPE_DIDDLE", Const, 1, ""},
 11683  		{"ETHERTYPE_DLOG1", Const, 1, ""},
 11684  		{"ETHERTYPE_DLOG2", Const, 1, ""},
 11685  		{"ETHERTYPE_DN", Const, 1, ""},
 11686  		{"ETHERTYPE_DOGFIGHT", Const, 1, ""},
 11687  		{"ETHERTYPE_DSMD", Const, 1, ""},
 11688  		{"ETHERTYPE_ECMA", Const, 1, ""},
 11689  		{"ETHERTYPE_ENCRYPT", Const, 1, ""},
 11690  		{"ETHERTYPE_ES", Const, 1, ""},
 11691  		{"ETHERTYPE_EXCELAN", Const, 1, ""},
 11692  		{"ETHERTYPE_EXPERDATA", Const, 1, ""},
 11693  		{"ETHERTYPE_FLIP", Const, 1, ""},
 11694  		{"ETHERTYPE_FLOWCONTROL", Const, 1, ""},
 11695  		{"ETHERTYPE_FRARP", Const, 1, ""},
 11696  		{"ETHERTYPE_GENDYN", Const, 1, ""},
 11697  		{"ETHERTYPE_HAYES", Const, 1, ""},
 11698  		{"ETHERTYPE_HIPPI_FP", Const, 1, ""},
 11699  		{"ETHERTYPE_HITACHI", Const, 1, ""},
 11700  		{"ETHERTYPE_HP", Const, 1, ""},
 11701  		{"ETHERTYPE_IEEEPUP", Const, 1, ""},
 11702  		{"ETHERTYPE_IEEEPUPAT", Const, 1, ""},
 11703  		{"ETHERTYPE_IMLBL", Const, 1, ""},
 11704  		{"ETHERTYPE_IMLBLDIAG", Const, 1, ""},
 11705  		{"ETHERTYPE_IP", Const, 1, ""},
 11706  		{"ETHERTYPE_IPAS", Const, 1, ""},
 11707  		{"ETHERTYPE_IPV6", Const, 1, ""},
 11708  		{"ETHERTYPE_IPX", Const, 1, ""},
 11709  		{"ETHERTYPE_IPXNEW", Const, 1, ""},
 11710  		{"ETHERTYPE_KALPANA", Const, 1, ""},
 11711  		{"ETHERTYPE_LANBRIDGE", Const, 1, ""},
 11712  		{"ETHERTYPE_LANPROBE", Const, 1, ""},
 11713  		{"ETHERTYPE_LAT", Const, 1, ""},
 11714  		{"ETHERTYPE_LBACK", Const, 1, ""},
 11715  		{"ETHERTYPE_LITTLE", Const, 1, ""},
 11716  		{"ETHERTYPE_LLDP", Const, 1, ""},
 11717  		{"ETHERTYPE_LOGICRAFT", Const, 1, ""},
 11718  		{"ETHERTYPE_LOOPBACK", Const, 1, ""},
 11719  		{"ETHERTYPE_MATRA", Const, 1, ""},
 11720  		{"ETHERTYPE_MAX", Const, 1, ""},
 11721  		{"ETHERTYPE_MERIT", Const, 1, ""},
 11722  		{"ETHERTYPE_MICP", Const, 1, ""},
 11723  		{"ETHERTYPE_MOPDL", Const, 1, ""},
 11724  		{"ETHERTYPE_MOPRC", Const, 1, ""},
 11725  		{"ETHERTYPE_MOTOROLA", Const, 1, ""},
 11726  		{"ETHERTYPE_MPLS", Const, 1, ""},
 11727  		{"ETHERTYPE_MPLS_MCAST", Const, 1, ""},
 11728  		{"ETHERTYPE_MUMPS", Const, 1, ""},
 11729  		{"ETHERTYPE_NBPCC", Const, 1, ""},
 11730  		{"ETHERTYPE_NBPCLAIM", Const, 1, ""},
 11731  		{"ETHERTYPE_NBPCLREQ", Const, 1, ""},
 11732  		{"ETHERTYPE_NBPCLRSP", Const, 1, ""},
 11733  		{"ETHERTYPE_NBPCREQ", Const, 1, ""},
 11734  		{"ETHERTYPE_NBPCRSP", Const, 1, ""},
 11735  		{"ETHERTYPE_NBPDG", Const, 1, ""},
 11736  		{"ETHERTYPE_NBPDGB", Const, 1, ""},
 11737  		{"ETHERTYPE_NBPDLTE", Const, 1, ""},
 11738  		{"ETHERTYPE_NBPRAR", Const, 1, ""},
 11739  		{"ETHERTYPE_NBPRAS", Const, 1, ""},
 11740  		{"ETHERTYPE_NBPRST", Const, 1, ""},
 11741  		{"ETHERTYPE_NBPSCD", Const, 1, ""},
 11742  		{"ETHERTYPE_NBPVCD", Const, 1, ""},
 11743  		{"ETHERTYPE_NBS", Const, 1, ""},
 11744  		{"ETHERTYPE_NCD", Const, 1, ""},
 11745  		{"ETHERTYPE_NESTAR", Const, 1, ""},
 11746  		{"ETHERTYPE_NETBEUI", Const, 1, ""},
 11747  		{"ETHERTYPE_NOVELL", Const, 1, ""},
 11748  		{"ETHERTYPE_NS", Const, 1, ""},
 11749  		{"ETHERTYPE_NSAT", Const, 1, ""},
 11750  		{"ETHERTYPE_NSCOMPAT", Const, 1, ""},
 11751  		{"ETHERTYPE_NTRAILER", Const, 1, ""},
 11752  		{"ETHERTYPE_OS9", Const, 1, ""},
 11753  		{"ETHERTYPE_OS9NET", Const, 1, ""},
 11754  		{"ETHERTYPE_PACER", Const, 1, ""},
 11755  		{"ETHERTYPE_PAE", Const, 1, ""},
 11756  		{"ETHERTYPE_PCS", Const, 1, ""},
 11757  		{"ETHERTYPE_PLANNING", Const, 1, ""},
 11758  		{"ETHERTYPE_PPP", Const, 1, ""},
 11759  		{"ETHERTYPE_PPPOE", Const, 1, ""},
 11760  		{"ETHERTYPE_PPPOEDISC", Const, 1, ""},
 11761  		{"ETHERTYPE_PRIMENTS", Const, 1, ""},
 11762  		{"ETHERTYPE_PUP", Const, 1, ""},
 11763  		{"ETHERTYPE_PUPAT", Const, 1, ""},
 11764  		{"ETHERTYPE_QINQ", Const, 1, ""},
 11765  		{"ETHERTYPE_RACAL", Const, 1, ""},
 11766  		{"ETHERTYPE_RATIONAL", Const, 1, ""},
 11767  		{"ETHERTYPE_RAWFR", Const, 1, ""},
 11768  		{"ETHERTYPE_RCL", Const, 1, ""},
 11769  		{"ETHERTYPE_RDP", Const, 1, ""},
 11770  		{"ETHERTYPE_RETIX", Const, 1, ""},
 11771  		{"ETHERTYPE_REVARP", Const, 1, ""},
 11772  		{"ETHERTYPE_SCA", Const, 1, ""},
 11773  		{"ETHERTYPE_SECTRA", Const, 1, ""},
 11774  		{"ETHERTYPE_SECUREDATA", Const, 1, ""},
 11775  		{"ETHERTYPE_SGITW", Const, 1, ""},
 11776  		{"ETHERTYPE_SG_BOUNCE", Const, 1, ""},
 11777  		{"ETHERTYPE_SG_DIAG", Const, 1, ""},
 11778  		{"ETHERTYPE_SG_NETGAMES", Const, 1, ""},
 11779  		{"ETHERTYPE_SG_RESV", Const, 1, ""},
 11780  		{"ETHERTYPE_SIMNET", Const, 1, ""},
 11781  		{"ETHERTYPE_SLOW", Const, 1, ""},
 11782  		{"ETHERTYPE_SLOWPROTOCOLS", Const, 1, ""},
 11783  		{"ETHERTYPE_SNA", Const, 1, ""},
 11784  		{"ETHERTYPE_SNMP", Const, 1, ""},
 11785  		{"ETHERTYPE_SONIX", Const, 1, ""},
 11786  		{"ETHERTYPE_SPIDER", Const, 1, ""},
 11787  		{"ETHERTYPE_SPRITE", Const, 1, ""},
 11788  		{"ETHERTYPE_STP", Const, 1, ""},
 11789  		{"ETHERTYPE_TALARIS", Const, 1, ""},
 11790  		{"ETHERTYPE_TALARISMC", Const, 1, ""},
 11791  		{"ETHERTYPE_TCPCOMP", Const, 1, ""},
 11792  		{"ETHERTYPE_TCPSM", Const, 1, ""},
 11793  		{"ETHERTYPE_TEC", Const, 1, ""},
 11794  		{"ETHERTYPE_TIGAN", Const, 1, ""},
 11795  		{"ETHERTYPE_TRAIL", Const, 1, ""},
 11796  		{"ETHERTYPE_TRANSETHER", Const, 1, ""},
 11797  		{"ETHERTYPE_TYMSHARE", Const, 1, ""},
 11798  		{"ETHERTYPE_UBBST", Const, 1, ""},
 11799  		{"ETHERTYPE_UBDEBUG", Const, 1, ""},
 11800  		{"ETHERTYPE_UBDIAGLOOP", Const, 1, ""},
 11801  		{"ETHERTYPE_UBDL", Const, 1, ""},
 11802  		{"ETHERTYPE_UBNIU", Const, 1, ""},
 11803  		{"ETHERTYPE_UBNMC", Const, 1, ""},
 11804  		{"ETHERTYPE_VALID", Const, 1, ""},
 11805  		{"ETHERTYPE_VARIAN", Const, 1, ""},
 11806  		{"ETHERTYPE_VAXELN", Const, 1, ""},
 11807  		{"ETHERTYPE_VEECO", Const, 1, ""},
 11808  		{"ETHERTYPE_VEXP", Const, 1, ""},
 11809  		{"ETHERTYPE_VGLAB", Const, 1, ""},
 11810  		{"ETHERTYPE_VINES", Const, 1, ""},
 11811  		{"ETHERTYPE_VINESECHO", Const, 1, ""},
 11812  		{"ETHERTYPE_VINESLOOP", Const, 1, ""},
 11813  		{"ETHERTYPE_VITAL", Const, 1, ""},
 11814  		{"ETHERTYPE_VLAN", Const, 1, ""},
 11815  		{"ETHERTYPE_VLTLMAN", Const, 1, ""},
 11816  		{"ETHERTYPE_VPROD", Const, 1, ""},
 11817  		{"ETHERTYPE_VURESERVED", Const, 1, ""},
 11818  		{"ETHERTYPE_WATERLOO", Const, 1, ""},
 11819  		{"ETHERTYPE_WELLFLEET", Const, 1, ""},
 11820  		{"ETHERTYPE_X25", Const, 1, ""},
 11821  		{"ETHERTYPE_X75", Const, 1, ""},
 11822  		{"ETHERTYPE_XNSSM", Const, 1, ""},
 11823  		{"ETHERTYPE_XTP", Const, 1, ""},
 11824  		{"ETHER_ADDR_LEN", Const, 1, ""},
 11825  		{"ETHER_ALIGN", Const, 1, ""},
 11826  		{"ETHER_CRC_LEN", Const, 1, ""},
 11827  		{"ETHER_CRC_POLY_BE", Const, 1, ""},
 11828  		{"ETHER_CRC_POLY_LE", Const, 1, ""},
 11829  		{"ETHER_HDR_LEN", Const, 1, ""},
 11830  		{"ETHER_MAX_DIX_LEN", Const, 1, ""},
 11831  		{"ETHER_MAX_LEN", Const, 1, ""},
 11832  		{"ETHER_MAX_LEN_JUMBO", Const, 1, ""},
 11833  		{"ETHER_MIN_LEN", Const, 1, ""},
 11834  		{"ETHER_PPPOE_ENCAP_LEN", Const, 1, ""},
 11835  		{"ETHER_TYPE_LEN", Const, 1, ""},
 11836  		{"ETHER_VLAN_ENCAP_LEN", Const, 1, ""},
 11837  		{"ETH_P_1588", Const, 0, ""},
 11838  		{"ETH_P_8021Q", Const, 0, ""},
 11839  		{"ETH_P_802_2", Const, 0, ""},
 11840  		{"ETH_P_802_3", Const, 0, ""},
 11841  		{"ETH_P_AARP", Const, 0, ""},
 11842  		{"ETH_P_ALL", Const, 0, ""},
 11843  		{"ETH_P_AOE", Const, 0, ""},
 11844  		{"ETH_P_ARCNET", Const, 0, ""},
 11845  		{"ETH_P_ARP", Const, 0, ""},
 11846  		{"ETH_P_ATALK", Const, 0, ""},
 11847  		{"ETH_P_ATMFATE", Const, 0, ""},
 11848  		{"ETH_P_ATMMPOA", Const, 0, ""},
 11849  		{"ETH_P_AX25", Const, 0, ""},
 11850  		{"ETH_P_BPQ", Const, 0, ""},
 11851  		{"ETH_P_CAIF", Const, 0, ""},
 11852  		{"ETH_P_CAN", Const, 0, ""},
 11853  		{"ETH_P_CONTROL", Const, 0, ""},
 11854  		{"ETH_P_CUST", Const, 0, ""},
 11855  		{"ETH_P_DDCMP", Const, 0, ""},
 11856  		{"ETH_P_DEC", Const, 0, ""},
 11857  		{"ETH_P_DIAG", Const, 0, ""},
 11858  		{"ETH_P_DNA_DL", Const, 0, ""},
 11859  		{"ETH_P_DNA_RC", Const, 0, ""},
 11860  		{"ETH_P_DNA_RT", Const, 0, ""},
 11861  		{"ETH_P_DSA", Const, 0, ""},
 11862  		{"ETH_P_ECONET", Const, 0, ""},
 11863  		{"ETH_P_EDSA", Const, 0, ""},
 11864  		{"ETH_P_FCOE", Const, 0, ""},
 11865  		{"ETH_P_FIP", Const, 0, ""},
 11866  		{"ETH_P_HDLC", Const, 0, ""},
 11867  		{"ETH_P_IEEE802154", Const, 0, ""},
 11868  		{"ETH_P_IEEEPUP", Const, 0, ""},
 11869  		{"ETH_P_IEEEPUPAT", Const, 0, ""},
 11870  		{"ETH_P_IP", Const, 0, ""},
 11871  		{"ETH_P_IPV6", Const, 0, ""},
 11872  		{"ETH_P_IPX", Const, 0, ""},
 11873  		{"ETH_P_IRDA", Const, 0, ""},
 11874  		{"ETH_P_LAT", Const, 0, ""},
 11875  		{"ETH_P_LINK_CTL", Const, 0, ""},
 11876  		{"ETH_P_LOCALTALK", Const, 0, ""},
 11877  		{"ETH_P_LOOP", Const, 0, ""},
 11878  		{"ETH_P_MOBITEX", Const, 0, ""},
 11879  		{"ETH_P_MPLS_MC", Const, 0, ""},
 11880  		{"ETH_P_MPLS_UC", Const, 0, ""},
 11881  		{"ETH_P_PAE", Const, 0, ""},
 11882  		{"ETH_P_PAUSE", Const, 0, ""},
 11883  		{"ETH_P_PHONET", Const, 0, ""},
 11884  		{"ETH_P_PPPTALK", Const, 0, ""},
 11885  		{"ETH_P_PPP_DISC", Const, 0, ""},
 11886  		{"ETH_P_PPP_MP", Const, 0, ""},
 11887  		{"ETH_P_PPP_SES", Const, 0, ""},
 11888  		{"ETH_P_PUP", Const, 0, ""},
 11889  		{"ETH_P_PUPAT", Const, 0, ""},
 11890  		{"ETH_P_RARP", Const, 0, ""},
 11891  		{"ETH_P_SCA", Const, 0, ""},
 11892  		{"ETH_P_SLOW", Const, 0, ""},
 11893  		{"ETH_P_SNAP", Const, 0, ""},
 11894  		{"ETH_P_TEB", Const, 0, ""},
 11895  		{"ETH_P_TIPC", Const, 0, ""},
 11896  		{"ETH_P_TRAILER", Const, 0, ""},
 11897  		{"ETH_P_TR_802_2", Const, 0, ""},
 11898  		{"ETH_P_WAN_PPP", Const, 0, ""},
 11899  		{"ETH_P_WCCP", Const, 0, ""},
 11900  		{"ETH_P_X25", Const, 0, ""},
 11901  		{"ETIME", Const, 0, ""},
 11902  		{"ETIMEDOUT", Const, 0, ""},
 11903  		{"ETOOMANYREFS", Const, 0, ""},
 11904  		{"ETXTBSY", Const, 0, ""},
 11905  		{"EUCLEAN", Const, 0, ""},
 11906  		{"EUNATCH", Const, 0, ""},
 11907  		{"EUSERS", Const, 0, ""},
 11908  		{"EVFILT_AIO", Const, 0, ""},
 11909  		{"EVFILT_FS", Const, 0, ""},
 11910  		{"EVFILT_LIO", Const, 0, ""},
 11911  		{"EVFILT_MACHPORT", Const, 0, ""},
 11912  		{"EVFILT_PROC", Const, 0, ""},
 11913  		{"EVFILT_READ", Const, 0, ""},
 11914  		{"EVFILT_SIGNAL", Const, 0, ""},
 11915  		{"EVFILT_SYSCOUNT", Const, 0, ""},
 11916  		{"EVFILT_THREADMARKER", Const, 0, ""},
 11917  		{"EVFILT_TIMER", Const, 0, ""},
 11918  		{"EVFILT_USER", Const, 0, ""},
 11919  		{"EVFILT_VM", Const, 0, ""},
 11920  		{"EVFILT_VNODE", Const, 0, ""},
 11921  		{"EVFILT_WRITE", Const, 0, ""},
 11922  		{"EV_ADD", Const, 0, ""},
 11923  		{"EV_CLEAR", Const, 0, ""},
 11924  		{"EV_DELETE", Const, 0, ""},
 11925  		{"EV_DISABLE", Const, 0, ""},
 11926  		{"EV_DISPATCH", Const, 0, ""},
 11927  		{"EV_DROP", Const, 3, ""},
 11928  		{"EV_ENABLE", Const, 0, ""},
 11929  		{"EV_EOF", Const, 0, ""},
 11930  		{"EV_ERROR", Const, 0, ""},
 11931  		{"EV_FLAG0", Const, 0, ""},
 11932  		{"EV_FLAG1", Const, 0, ""},
 11933  		{"EV_ONESHOT", Const, 0, ""},
 11934  		{"EV_OOBAND", Const, 0, ""},
 11935  		{"EV_POLL", Const, 0, ""},
 11936  		{"EV_RECEIPT", Const, 0, ""},
 11937  		{"EV_SYSFLAGS", Const, 0, ""},
 11938  		{"EWINDOWS", Const, 0, ""},
 11939  		{"EWOULDBLOCK", Const, 0, ""},
 11940  		{"EXDEV", Const, 0, ""},
 11941  		{"EXFULL", Const, 0, ""},
 11942  		{"EXTA", Const, 0, ""},
 11943  		{"EXTB", Const, 0, ""},
 11944  		{"EXTPROC", Const, 0, ""},
 11945  		{"Environ", Func, 0, "func() []string"},
 11946  		{"EpollCreate", Func, 0, "func(size int) (fd int, err error)"},
 11947  		{"EpollCreate1", Func, 0, "func(flag int) (fd int, err error)"},
 11948  		{"EpollCtl", Func, 0, "func(epfd int, op int, fd int, event *EpollEvent) (err error)"},
 11949  		{"EpollEvent", Type, 0, ""},
 11950  		{"EpollEvent.Events", Field, 0, ""},
 11951  		{"EpollEvent.Fd", Field, 0, ""},
 11952  		{"EpollEvent.Pad", Field, 0, ""},
 11953  		{"EpollEvent.PadFd", Field, 0, ""},
 11954  		{"EpollWait", Func, 0, "func(epfd int, events []EpollEvent, msec int) (n int, err error)"},
 11955  		{"Errno", Type, 0, ""},
 11956  		{"EscapeArg", Func, 0, ""},
 11957  		{"Exchangedata", Func, 0, ""},
 11958  		{"Exec", Func, 0, "func(argv0 string, argv []string, envv []string) (err error)"},
 11959  		{"Exit", Func, 0, "func(code int)"},
 11960  		{"ExitProcess", Func, 0, ""},
 11961  		{"FD_CLOEXEC", Const, 0, ""},
 11962  		{"FD_SETSIZE", Const, 0, ""},
 11963  		{"FILE_ACTION_ADDED", Const, 0, ""},
 11964  		{"FILE_ACTION_MODIFIED", Const, 0, ""},
 11965  		{"FILE_ACTION_REMOVED", Const, 0, ""},
 11966  		{"FILE_ACTION_RENAMED_NEW_NAME", Const, 0, ""},
 11967  		{"FILE_ACTION_RENAMED_OLD_NAME", Const, 0, ""},
 11968  		{"FILE_APPEND_DATA", Const, 0, ""},
 11969  		{"FILE_ATTRIBUTE_ARCHIVE", Const, 0, ""},
 11970  		{"FILE_ATTRIBUTE_DIRECTORY", Const, 0, ""},
 11971  		{"FILE_ATTRIBUTE_HIDDEN", Const, 0, ""},
 11972  		{"FILE_ATTRIBUTE_NORMAL", Const, 0, ""},
 11973  		{"FILE_ATTRIBUTE_READONLY", Const, 0, ""},
 11974  		{"FILE_ATTRIBUTE_REPARSE_POINT", Const, 4, ""},
 11975  		{"FILE_ATTRIBUTE_SYSTEM", Const, 0, ""},
 11976  		{"FILE_BEGIN", Const, 0, ""},
 11977  		{"FILE_CURRENT", Const, 0, ""},
 11978  		{"FILE_END", Const, 0, ""},
 11979  		{"FILE_FLAG_BACKUP_SEMANTICS", Const, 0, ""},
 11980  		{"FILE_FLAG_OPEN_REPARSE_POINT", Const, 4, ""},
 11981  		{"FILE_FLAG_OVERLAPPED", Const, 0, ""},
 11982  		{"FILE_LIST_DIRECTORY", Const, 0, ""},
 11983  		{"FILE_MAP_COPY", Const, 0, ""},
 11984  		{"FILE_MAP_EXECUTE", Const, 0, ""},
 11985  		{"FILE_MAP_READ", Const, 0, ""},
 11986  		{"FILE_MAP_WRITE", Const, 0, ""},
 11987  		{"FILE_NOTIFY_CHANGE_ATTRIBUTES", Const, 0, ""},
 11988  		{"FILE_NOTIFY_CHANGE_CREATION", Const, 0, ""},
 11989  		{"FILE_NOTIFY_CHANGE_DIR_NAME", Const, 0, ""},
 11990  		{"FILE_NOTIFY_CHANGE_FILE_NAME", Const, 0, ""},
 11991  		{"FILE_NOTIFY_CHANGE_LAST_ACCESS", Const, 0, ""},
 11992  		{"FILE_NOTIFY_CHANGE_LAST_WRITE", Const, 0, ""},
 11993  		{"FILE_NOTIFY_CHANGE_SIZE", Const, 0, ""},
 11994  		{"FILE_SHARE_DELETE", Const, 0, ""},
 11995  		{"FILE_SHARE_READ", Const, 0, ""},
 11996  		{"FILE_SHARE_WRITE", Const, 0, ""},
 11997  		{"FILE_SKIP_COMPLETION_PORT_ON_SUCCESS", Const, 2, ""},
 11998  		{"FILE_SKIP_SET_EVENT_ON_HANDLE", Const, 2, ""},
 11999  		{"FILE_TYPE_CHAR", Const, 0, ""},
 12000  		{"FILE_TYPE_DISK", Const, 0, ""},
 12001  		{"FILE_TYPE_PIPE", Const, 0, ""},
 12002  		{"FILE_TYPE_REMOTE", Const, 0, ""},
 12003  		{"FILE_TYPE_UNKNOWN", Const, 0, ""},
 12004  		{"FILE_WRITE_ATTRIBUTES", Const, 0, ""},
 12005  		{"FLUSHO", Const, 0, ""},
 12006  		{"FORMAT_MESSAGE_ALLOCATE_BUFFER", Const, 0, ""},
 12007  		{"FORMAT_MESSAGE_ARGUMENT_ARRAY", Const, 0, ""},
 12008  		{"FORMAT_MESSAGE_FROM_HMODULE", Const, 0, ""},
 12009  		{"FORMAT_MESSAGE_FROM_STRING", Const, 0, ""},
 12010  		{"FORMAT_MESSAGE_FROM_SYSTEM", Const, 0, ""},
 12011  		{"FORMAT_MESSAGE_IGNORE_INSERTS", Const, 0, ""},
 12012  		{"FORMAT_MESSAGE_MAX_WIDTH_MASK", Const, 0, ""},
 12013  		{"FSCTL_GET_REPARSE_POINT", Const, 4, ""},
 12014  		{"F_ADDFILESIGS", Const, 0, ""},
 12015  		{"F_ADDSIGS", Const, 0, ""},
 12016  		{"F_ALLOCATEALL", Const, 0, ""},
 12017  		{"F_ALLOCATECONTIG", Const, 0, ""},
 12018  		{"F_CANCEL", Const, 0, ""},
 12019  		{"F_CHKCLEAN", Const, 0, ""},
 12020  		{"F_CLOSEM", Const, 1, ""},
 12021  		{"F_DUP2FD", Const, 0, ""},
 12022  		{"F_DUP2FD_CLOEXEC", Const, 1, ""},
 12023  		{"F_DUPFD", Const, 0, ""},
 12024  		{"F_DUPFD_CLOEXEC", Const, 0, ""},
 12025  		{"F_EXLCK", Const, 0, ""},
 12026  		{"F_FINDSIGS", Const, 16, ""},
 12027  		{"F_FLUSH_DATA", Const, 0, ""},
 12028  		{"F_FREEZE_FS", Const, 0, ""},
 12029  		{"F_FSCTL", Const, 1, ""},
 12030  		{"F_FSDIRMASK", Const, 1, ""},
 12031  		{"F_FSIN", Const, 1, ""},
 12032  		{"F_FSINOUT", Const, 1, ""},
 12033  		{"F_FSOUT", Const, 1, ""},
 12034  		{"F_FSPRIV", Const, 1, ""},
 12035  		{"F_FSVOID", Const, 1, ""},
 12036  		{"F_FULLFSYNC", Const, 0, ""},
 12037  		{"F_GETCODEDIR", Const, 16, ""},
 12038  		{"F_GETFD", Const, 0, ""},
 12039  		{"F_GETFL", Const, 0, ""},
 12040  		{"F_GETLEASE", Const, 0, ""},
 12041  		{"F_GETLK", Const, 0, ""},
 12042  		{"F_GETLK64", Const, 0, ""},
 12043  		{"F_GETLKPID", Const, 0, ""},
 12044  		{"F_GETNOSIGPIPE", Const, 0, ""},
 12045  		{"F_GETOWN", Const, 0, ""},
 12046  		{"F_GETOWN_EX", Const, 0, ""},
 12047  		{"F_GETPATH", Const, 0, ""},
 12048  		{"F_GETPATH_MTMINFO", Const, 0, ""},
 12049  		{"F_GETPIPE_SZ", Const, 0, ""},
 12050  		{"F_GETPROTECTIONCLASS", Const, 0, ""},
 12051  		{"F_GETPROTECTIONLEVEL", Const, 16, ""},
 12052  		{"F_GETSIG", Const, 0, ""},
 12053  		{"F_GLOBAL_NOCACHE", Const, 0, ""},
 12054  		{"F_LOCK", Const, 0, ""},
 12055  		{"F_LOG2PHYS", Const, 0, ""},
 12056  		{"F_LOG2PHYS_EXT", Const, 0, ""},
 12057  		{"F_MARKDEPENDENCY", Const, 0, ""},
 12058  		{"F_MAXFD", Const, 1, ""},
 12059  		{"F_NOCACHE", Const, 0, ""},
 12060  		{"F_NODIRECT", Const, 0, ""},
 12061  		{"F_NOTIFY", Const, 0, ""},
 12062  		{"F_OGETLK", Const, 0, ""},
 12063  		{"F_OK", Const, 0, ""},
 12064  		{"F_OSETLK", Const, 0, ""},
 12065  		{"F_OSETLKW", Const, 0, ""},
 12066  		{"F_PARAM_MASK", Const, 1, ""},
 12067  		{"F_PARAM_MAX", Const, 1, ""},
 12068  		{"F_PATHPKG_CHECK", Const, 0, ""},
 12069  		{"F_PEOFPOSMODE", Const, 0, ""},
 12070  		{"F_PREALLOCATE", Const, 0, ""},
 12071  		{"F_RDADVISE", Const, 0, ""},
 12072  		{"F_RDAHEAD", Const, 0, ""},
 12073  		{"F_RDLCK", Const, 0, ""},
 12074  		{"F_READAHEAD", Const, 0, ""},
 12075  		{"F_READBOOTSTRAP", Const, 0, ""},
 12076  		{"F_SETBACKINGSTORE", Const, 0, ""},
 12077  		{"F_SETFD", Const, 0, ""},
 12078  		{"F_SETFL", Const, 0, ""},
 12079  		{"F_SETLEASE", Const, 0, ""},
 12080  		{"F_SETLK", Const, 0, ""},
 12081  		{"F_SETLK64", Const, 0, ""},
 12082  		{"F_SETLKW", Const, 0, ""},
 12083  		{"F_SETLKW64", Const, 0, ""},
 12084  		{"F_SETLKWTIMEOUT", Const, 16, ""},
 12085  		{"F_SETLK_REMOTE", Const, 0, ""},
 12086  		{"F_SETNOSIGPIPE", Const, 0, ""},
 12087  		{"F_SETOWN", Const, 0, ""},
 12088  		{"F_SETOWN_EX", Const, 0, ""},
 12089  		{"F_SETPIPE_SZ", Const, 0, ""},
 12090  		{"F_SETPROTECTIONCLASS", Const, 0, ""},
 12091  		{"F_SETSIG", Const, 0, ""},
 12092  		{"F_SETSIZE", Const, 0, ""},
 12093  		{"F_SHLCK", Const, 0, ""},
 12094  		{"F_SINGLE_WRITER", Const, 16, ""},
 12095  		{"F_TEST", Const, 0, ""},
 12096  		{"F_THAW_FS", Const, 0, ""},
 12097  		{"F_TLOCK", Const, 0, ""},
 12098  		{"F_TRANSCODEKEY", Const, 16, ""},
 12099  		{"F_ULOCK", Const, 0, ""},
 12100  		{"F_UNLCK", Const, 0, ""},
 12101  		{"F_UNLCKSYS", Const, 0, ""},
 12102  		{"F_VOLPOSMODE", Const, 0, ""},
 12103  		{"F_WRITEBOOTSTRAP", Const, 0, ""},
 12104  		{"F_WRLCK", Const, 0, ""},
 12105  		{"Faccessat", Func, 0, "func(dirfd int, path string, mode uint32, flags int) (err error)"},
 12106  		{"Fallocate", Func, 0, "func(fd int, mode uint32, off int64, len int64) (err error)"},
 12107  		{"Fbootstraptransfer_t", Type, 0, ""},
 12108  		{"Fbootstraptransfer_t.Buffer", Field, 0, ""},
 12109  		{"Fbootstraptransfer_t.Length", Field, 0, ""},
 12110  		{"Fbootstraptransfer_t.Offset", Field, 0, ""},
 12111  		{"Fchdir", Func, 0, "func(fd int) (err error)"},
 12112  		{"Fchflags", Func, 0, ""},
 12113  		{"Fchmod", Func, 0, "func(fd int, mode uint32) (err error)"},
 12114  		{"Fchmodat", Func, 0, "func(dirfd int, path string, mode uint32, flags int) error"},
 12115  		{"Fchown", Func, 0, "func(fd int, uid int, gid int) (err error)"},
 12116  		{"Fchownat", Func, 0, "func(dirfd int, path string, uid int, gid int, flags int) (err error)"},
 12117  		{"FcntlFlock", Func, 3, "func(fd uintptr, cmd int, lk *Flock_t) error"},
 12118  		{"FdSet", Type, 0, ""},
 12119  		{"FdSet.Bits", Field, 0, ""},
 12120  		{"FdSet.X__fds_bits", Field, 0, ""},
 12121  		{"Fdatasync", Func, 0, "func(fd int) (err error)"},
 12122  		{"FileNotifyInformation", Type, 0, ""},
 12123  		{"FileNotifyInformation.Action", Field, 0, ""},
 12124  		{"FileNotifyInformation.FileName", Field, 0, ""},
 12125  		{"FileNotifyInformation.FileNameLength", Field, 0, ""},
 12126  		{"FileNotifyInformation.NextEntryOffset", Field, 0, ""},
 12127  		{"Filetime", Type, 0, ""},
 12128  		{"Filetime.HighDateTime", Field, 0, ""},
 12129  		{"Filetime.LowDateTime", Field, 0, ""},
 12130  		{"FindClose", Func, 0, ""},
 12131  		{"FindFirstFile", Func, 0, ""},
 12132  		{"FindNextFile", Func, 0, ""},
 12133  		{"Flock", Func, 0, "func(fd int, how int) (err error)"},
 12134  		{"Flock_t", Type, 0, ""},
 12135  		{"Flock_t.Len", Field, 0, ""},
 12136  		{"Flock_t.Pad_cgo_0", Field, 0, ""},
 12137  		{"Flock_t.Pad_cgo_1", Field, 3, ""},
 12138  		{"Flock_t.Pid", Field, 0, ""},
 12139  		{"Flock_t.Start", Field, 0, ""},
 12140  		{"Flock_t.Sysid", Field, 0, ""},
 12141  		{"Flock_t.Type", Field, 0, ""},
 12142  		{"Flock_t.Whence", Field, 0, ""},
 12143  		{"FlushBpf", Func, 0, ""},
 12144  		{"FlushFileBuffers", Func, 0, ""},
 12145  		{"FlushViewOfFile", Func, 0, ""},
 12146  		{"ForkExec", Func, 0, "func(argv0 string, argv []string, attr *ProcAttr) (pid int, err error)"},
 12147  		{"ForkLock", Var, 0, ""},
 12148  		{"FormatMessage", Func, 0, ""},
 12149  		{"Fpathconf", Func, 0, ""},
 12150  		{"FreeAddrInfoW", Func, 1, ""},
 12151  		{"FreeEnvironmentStrings", Func, 0, ""},
 12152  		{"FreeLibrary", Func, 0, ""},
 12153  		{"Fsid", Type, 0, ""},
 12154  		{"Fsid.Val", Field, 0, ""},
 12155  		{"Fsid.X__fsid_val", Field, 2, ""},
 12156  		{"Fsid.X__val", Field, 0, ""},
 12157  		{"Fstat", Func, 0, "func(fd int, stat *Stat_t) (err error)"},
 12158  		{"Fstatat", Func, 12, ""},
 12159  		{"Fstatfs", Func, 0, "func(fd int, buf *Statfs_t) (err error)"},
 12160  		{"Fstore_t", Type, 0, ""},
 12161  		{"Fstore_t.Bytesalloc", Field, 0, ""},
 12162  		{"Fstore_t.Flags", Field, 0, ""},
 12163  		{"Fstore_t.Length", Field, 0, ""},
 12164  		{"Fstore_t.Offset", Field, 0, ""},
 12165  		{"Fstore_t.Posmode", Field, 0, ""},
 12166  		{"Fsync", Func, 0, "func(fd int) (err error)"},
 12167  		{"Ftruncate", Func, 0, "func(fd int, length int64) (err error)"},
 12168  		{"FullPath", Func, 4, ""},
 12169  		{"Futimes", Func, 0, "func(fd int, tv []Timeval) (err error)"},
 12170  		{"Futimesat", Func, 0, "func(dirfd int, path string, tv []Timeval) (err error)"},
 12171  		{"GENERIC_ALL", Const, 0, ""},
 12172  		{"GENERIC_EXECUTE", Const, 0, ""},
 12173  		{"GENERIC_READ", Const, 0, ""},
 12174  		{"GENERIC_WRITE", Const, 0, ""},
 12175  		{"GUID", Type, 1, ""},
 12176  		{"GUID.Data1", Field, 1, ""},
 12177  		{"GUID.Data2", Field, 1, ""},
 12178  		{"GUID.Data3", Field, 1, ""},
 12179  		{"GUID.Data4", Field, 1, ""},
 12180  		{"GetAcceptExSockaddrs", Func, 0, ""},
 12181  		{"GetAdaptersInfo", Func, 0, ""},
 12182  		{"GetAddrInfoW", Func, 1, ""},
 12183  		{"GetCommandLine", Func, 0, ""},
 12184  		{"GetComputerName", Func, 0, ""},
 12185  		{"GetConsoleMode", Func, 1, ""},
 12186  		{"GetCurrentDirectory", Func, 0, ""},
 12187  		{"GetCurrentProcess", Func, 0, ""},
 12188  		{"GetEnvironmentStrings", Func, 0, ""},
 12189  		{"GetEnvironmentVariable", Func, 0, ""},
 12190  		{"GetExitCodeProcess", Func, 0, ""},
 12191  		{"GetFileAttributes", Func, 0, ""},
 12192  		{"GetFileAttributesEx", Func, 0, ""},
 12193  		{"GetFileExInfoStandard", Const, 0, ""},
 12194  		{"GetFileExMaxInfoLevel", Const, 0, ""},
 12195  		{"GetFileInformationByHandle", Func, 0, ""},
 12196  		{"GetFileType", Func, 0, ""},
 12197  		{"GetFullPathName", Func, 0, ""},
 12198  		{"GetHostByName", Func, 0, ""},
 12199  		{"GetIfEntry", Func, 0, ""},
 12200  		{"GetLastError", Func, 0, ""},
 12201  		{"GetLengthSid", Func, 0, ""},
 12202  		{"GetLongPathName", Func, 0, ""},
 12203  		{"GetProcAddress", Func, 0, ""},
 12204  		{"GetProcessTimes", Func, 0, ""},
 12205  		{"GetProtoByName", Func, 0, ""},
 12206  		{"GetQueuedCompletionStatus", Func, 0, ""},
 12207  		{"GetServByName", Func, 0, ""},
 12208  		{"GetShortPathName", Func, 0, ""},
 12209  		{"GetStartupInfo", Func, 0, ""},
 12210  		{"GetStdHandle", Func, 0, ""},
 12211  		{"GetSystemTimeAsFileTime", Func, 0, ""},
 12212  		{"GetTempPath", Func, 0, ""},
 12213  		{"GetTimeZoneInformation", Func, 0, ""},
 12214  		{"GetTokenInformation", Func, 0, ""},
 12215  		{"GetUserNameEx", Func, 0, ""},
 12216  		{"GetUserProfileDirectory", Func, 0, ""},
 12217  		{"GetVersion", Func, 0, ""},
 12218  		{"Getcwd", Func, 0, "func(buf []byte) (n int, err error)"},
 12219  		{"Getdents", Func, 0, "func(fd int, buf []byte) (n int, err error)"},
 12220  		{"Getdirentries", Func, 0, ""},
 12221  		{"Getdtablesize", Func, 0, ""},
 12222  		{"Getegid", Func, 0, "func() (egid int)"},
 12223  		{"Getenv", Func, 0, "func(key string) (value string, found bool)"},
 12224  		{"Geteuid", Func, 0, "func() (euid int)"},
 12225  		{"Getfsstat", Func, 0, ""},
 12226  		{"Getgid", Func, 0, "func() (gid int)"},
 12227  		{"Getgroups", Func, 0, "func() (gids []int, err error)"},
 12228  		{"Getpagesize", Func, 0, "func() int"},
 12229  		{"Getpeername", Func, 0, "func(fd int) (sa Sockaddr, err error)"},
 12230  		{"Getpgid", Func, 0, "func(pid int) (pgid int, err error)"},
 12231  		{"Getpgrp", Func, 0, "func() (pid int)"},
 12232  		{"Getpid", Func, 0, "func() (pid int)"},
 12233  		{"Getppid", Func, 0, "func() (ppid int)"},
 12234  		{"Getpriority", Func, 0, "func(which int, who int) (prio int, err error)"},
 12235  		{"Getrlimit", Func, 0, "func(resource int, rlim *Rlimit) (err error)"},
 12236  		{"Getrusage", Func, 0, "func(who int, rusage *Rusage) (err error)"},
 12237  		{"Getsid", Func, 0, ""},
 12238  		{"Getsockname", Func, 0, "func(fd int) (sa Sockaddr, err error)"},
 12239  		{"Getsockopt", Func, 1, ""},
 12240  		{"GetsockoptByte", Func, 0, ""},
 12241  		{"GetsockoptICMPv6Filter", Func, 2, "func(fd int, level int, opt int) (*ICMPv6Filter, error)"},
 12242  		{"GetsockoptIPMreq", Func, 0, "func(fd int, level int, opt int) (*IPMreq, error)"},
 12243  		{"GetsockoptIPMreqn", Func, 0, "func(fd int, level int, opt int) (*IPMreqn, error)"},
 12244  		{"GetsockoptIPv6MTUInfo", Func, 2, "func(fd int, level int, opt int) (*IPv6MTUInfo, error)"},
 12245  		{"GetsockoptIPv6Mreq", Func, 0, "func(fd int, level int, opt int) (*IPv6Mreq, error)"},
 12246  		{"GetsockoptInet4Addr", Func, 0, "func(fd int, level int, opt int) (value [4]byte, err error)"},
 12247  		{"GetsockoptInt", Func, 0, "func(fd int, level int, opt int) (value int, err error)"},
 12248  		{"GetsockoptUcred", Func, 1, "func(fd int, level int, opt int) (*Ucred, error)"},
 12249  		{"Gettid", Func, 0, "func() (tid int)"},
 12250  		{"Gettimeofday", Func, 0, "func(tv *Timeval) (err error)"},
 12251  		{"Getuid", Func, 0, "func() (uid int)"},
 12252  		{"Getwd", Func, 0, "func() (wd string, err error)"},
 12253  		{"Getxattr", Func, 1, "func(path string, attr string, dest []byte) (sz int, err error)"},
 12254  		{"HANDLE_FLAG_INHERIT", Const, 0, ""},
 12255  		{"HKEY_CLASSES_ROOT", Const, 0, ""},
 12256  		{"HKEY_CURRENT_CONFIG", Const, 0, ""},
 12257  		{"HKEY_CURRENT_USER", Const, 0, ""},
 12258  		{"HKEY_DYN_DATA", Const, 0, ""},
 12259  		{"HKEY_LOCAL_MACHINE", Const, 0, ""},
 12260  		{"HKEY_PERFORMANCE_DATA", Const, 0, ""},
 12261  		{"HKEY_USERS", Const, 0, ""},
 12262  		{"HUPCL", Const, 0, ""},
 12263  		{"Handle", Type, 0, ""},
 12264  		{"Hostent", Type, 0, ""},
 12265  		{"Hostent.AddrList", Field, 0, ""},
 12266  		{"Hostent.AddrType", Field, 0, ""},
 12267  		{"Hostent.Aliases", Field, 0, ""},
 12268  		{"Hostent.Length", Field, 0, ""},
 12269  		{"Hostent.Name", Field, 0, ""},
 12270  		{"ICANON", Const, 0, ""},
 12271  		{"ICMP6_FILTER", Const, 2, ""},
 12272  		{"ICMPV6_FILTER", Const, 2, ""},
 12273  		{"ICMPv6Filter", Type, 2, ""},
 12274  		{"ICMPv6Filter.Data", Field, 2, ""},
 12275  		{"ICMPv6Filter.Filt", Field, 2, ""},
 12276  		{"ICRNL", Const, 0, ""},
 12277  		{"IEXTEN", Const, 0, ""},
 12278  		{"IFAN_ARRIVAL", Const, 1, ""},
 12279  		{"IFAN_DEPARTURE", Const, 1, ""},
 12280  		{"IFA_ADDRESS", Const, 0, ""},
 12281  		{"IFA_ANYCAST", Const, 0, ""},
 12282  		{"IFA_BROADCAST", Const, 0, ""},
 12283  		{"IFA_CACHEINFO", Const, 0, ""},
 12284  		{"IFA_F_DADFAILED", Const, 0, ""},
 12285  		{"IFA_F_DEPRECATED", Const, 0, ""},
 12286  		{"IFA_F_HOMEADDRESS", Const, 0, ""},
 12287  		{"IFA_F_NODAD", Const, 0, ""},
 12288  		{"IFA_F_OPTIMISTIC", Const, 0, ""},
 12289  		{"IFA_F_PERMANENT", Const, 0, ""},
 12290  		{"IFA_F_SECONDARY", Const, 0, ""},
 12291  		{"IFA_F_TEMPORARY", Const, 0, ""},
 12292  		{"IFA_F_TENTATIVE", Const, 0, ""},
 12293  		{"IFA_LABEL", Const, 0, ""},
 12294  		{"IFA_LOCAL", Const, 0, ""},
 12295  		{"IFA_MAX", Const, 0, ""},
 12296  		{"IFA_MULTICAST", Const, 0, ""},
 12297  		{"IFA_ROUTE", Const, 1, ""},
 12298  		{"IFA_UNSPEC", Const, 0, ""},
 12299  		{"IFF_ALLMULTI", Const, 0, ""},
 12300  		{"IFF_ALTPHYS", Const, 0, ""},
 12301  		{"IFF_AUTOMEDIA", Const, 0, ""},
 12302  		{"IFF_BROADCAST", Const, 0, ""},
 12303  		{"IFF_CANTCHANGE", Const, 0, ""},
 12304  		{"IFF_CANTCONFIG", Const, 1, ""},
 12305  		{"IFF_DEBUG", Const, 0, ""},
 12306  		{"IFF_DRV_OACTIVE", Const, 0, ""},
 12307  		{"IFF_DRV_RUNNING", Const, 0, ""},
 12308  		{"IFF_DYING", Const, 0, ""},
 12309  		{"IFF_DYNAMIC", Const, 0, ""},
 12310  		{"IFF_LINK0", Const, 0, ""},
 12311  		{"IFF_LINK1", Const, 0, ""},
 12312  		{"IFF_LINK2", Const, 0, ""},
 12313  		{"IFF_LOOPBACK", Const, 0, ""},
 12314  		{"IFF_MASTER", Const, 0, ""},
 12315  		{"IFF_MONITOR", Const, 0, ""},
 12316  		{"IFF_MULTICAST", Const, 0, ""},
 12317  		{"IFF_NOARP", Const, 0, ""},
 12318  		{"IFF_NOTRAILERS", Const, 0, ""},
 12319  		{"IFF_NO_PI", Const, 0, ""},
 12320  		{"IFF_OACTIVE", Const, 0, ""},
 12321  		{"IFF_ONE_QUEUE", Const, 0, ""},
 12322  		{"IFF_POINTOPOINT", Const, 0, ""},
 12323  		{"IFF_POINTTOPOINT", Const, 0, ""},
 12324  		{"IFF_PORTSEL", Const, 0, ""},
 12325  		{"IFF_PPROMISC", Const, 0, ""},
 12326  		{"IFF_PROMISC", Const, 0, ""},
 12327  		{"IFF_RENAMING", Const, 0, ""},
 12328  		{"IFF_RUNNING", Const, 0, ""},
 12329  		{"IFF_SIMPLEX", Const, 0, ""},
 12330  		{"IFF_SLAVE", Const, 0, ""},
 12331  		{"IFF_SMART", Const, 0, ""},
 12332  		{"IFF_STATICARP", Const, 0, ""},
 12333  		{"IFF_TAP", Const, 0, ""},
 12334  		{"IFF_TUN", Const, 0, ""},
 12335  		{"IFF_TUN_EXCL", Const, 0, ""},
 12336  		{"IFF_UP", Const, 0, ""},
 12337  		{"IFF_VNET_HDR", Const, 0, ""},
 12338  		{"IFLA_ADDRESS", Const, 0, ""},
 12339  		{"IFLA_BROADCAST", Const, 0, ""},
 12340  		{"IFLA_COST", Const, 0, ""},
 12341  		{"IFLA_IFALIAS", Const, 0, ""},
 12342  		{"IFLA_IFNAME", Const, 0, ""},
 12343  		{"IFLA_LINK", Const, 0, ""},
 12344  		{"IFLA_LINKINFO", Const, 0, ""},
 12345  		{"IFLA_LINKMODE", Const, 0, ""},
 12346  		{"IFLA_MAP", Const, 0, ""},
 12347  		{"IFLA_MASTER", Const, 0, ""},
 12348  		{"IFLA_MAX", Const, 0, ""},
 12349  		{"IFLA_MTU", Const, 0, ""},
 12350  		{"IFLA_NET_NS_PID", Const, 0, ""},
 12351  		{"IFLA_OPERSTATE", Const, 0, ""},
 12352  		{"IFLA_PRIORITY", Const, 0, ""},
 12353  		{"IFLA_PROTINFO", Const, 0, ""},
 12354  		{"IFLA_QDISC", Const, 0, ""},
 12355  		{"IFLA_STATS", Const, 0, ""},
 12356  		{"IFLA_TXQLEN", Const, 0, ""},
 12357  		{"IFLA_UNSPEC", Const, 0, ""},
 12358  		{"IFLA_WEIGHT", Const, 0, ""},
 12359  		{"IFLA_WIRELESS", Const, 0, ""},
 12360  		{"IFNAMSIZ", Const, 0, ""},
 12361  		{"IFT_1822", Const, 0, ""},
 12362  		{"IFT_A12MPPSWITCH", Const, 0, ""},
 12363  		{"IFT_AAL2", Const, 0, ""},
 12364  		{"IFT_AAL5", Const, 0, ""},
 12365  		{"IFT_ADSL", Const, 0, ""},
 12366  		{"IFT_AFLANE8023", Const, 0, ""},
 12367  		{"IFT_AFLANE8025", Const, 0, ""},
 12368  		{"IFT_ARAP", Const, 0, ""},
 12369  		{"IFT_ARCNET", Const, 0, ""},
 12370  		{"IFT_ARCNETPLUS", Const, 0, ""},
 12371  		{"IFT_ASYNC", Const, 0, ""},
 12372  		{"IFT_ATM", Const, 0, ""},
 12373  		{"IFT_ATMDXI", Const, 0, ""},
 12374  		{"IFT_ATMFUNI", Const, 0, ""},
 12375  		{"IFT_ATMIMA", Const, 0, ""},
 12376  		{"IFT_ATMLOGICAL", Const, 0, ""},
 12377  		{"IFT_ATMRADIO", Const, 0, ""},
 12378  		{"IFT_ATMSUBINTERFACE", Const, 0, ""},
 12379  		{"IFT_ATMVCIENDPT", Const, 0, ""},
 12380  		{"IFT_ATMVIRTUAL", Const, 0, ""},
 12381  		{"IFT_BGPPOLICYACCOUNTING", Const, 0, ""},
 12382  		{"IFT_BLUETOOTH", Const, 1, ""},
 12383  		{"IFT_BRIDGE", Const, 0, ""},
 12384  		{"IFT_BSC", Const, 0, ""},
 12385  		{"IFT_CARP", Const, 0, ""},
 12386  		{"IFT_CCTEMUL", Const, 0, ""},
 12387  		{"IFT_CELLULAR", Const, 0, ""},
 12388  		{"IFT_CEPT", Const, 0, ""},
 12389  		{"IFT_CES", Const, 0, ""},
 12390  		{"IFT_CHANNEL", Const, 0, ""},
 12391  		{"IFT_CNR", Const, 0, ""},
 12392  		{"IFT_COFFEE", Const, 0, ""},
 12393  		{"IFT_COMPOSITELINK", Const, 0, ""},
 12394  		{"IFT_DCN", Const, 0, ""},
 12395  		{"IFT_DIGITALPOWERLINE", Const, 0, ""},
 12396  		{"IFT_DIGITALWRAPPEROVERHEADCHANNEL", Const, 0, ""},
 12397  		{"IFT_DLSW", Const, 0, ""},
 12398  		{"IFT_DOCSCABLEDOWNSTREAM", Const, 0, ""},
 12399  		{"IFT_DOCSCABLEMACLAYER", Const, 0, ""},
 12400  		{"IFT_DOCSCABLEUPSTREAM", Const, 0, ""},
 12401  		{"IFT_DOCSCABLEUPSTREAMCHANNEL", Const, 1, ""},
 12402  		{"IFT_DS0", Const, 0, ""},
 12403  		{"IFT_DS0BUNDLE", Const, 0, ""},
 12404  		{"IFT_DS1FDL", Const, 0, ""},
 12405  		{"IFT_DS3", Const, 0, ""},
 12406  		{"IFT_DTM", Const, 0, ""},
 12407  		{"IFT_DUMMY", Const, 1, ""},
 12408  		{"IFT_DVBASILN", Const, 0, ""},
 12409  		{"IFT_DVBASIOUT", Const, 0, ""},
 12410  		{"IFT_DVBRCCDOWNSTREAM", Const, 0, ""},
 12411  		{"IFT_DVBRCCMACLAYER", Const, 0, ""},
 12412  		{"IFT_DVBRCCUPSTREAM", Const, 0, ""},
 12413  		{"IFT_ECONET", Const, 1, ""},
 12414  		{"IFT_ENC", Const, 0, ""},
 12415  		{"IFT_EON", Const, 0, ""},
 12416  		{"IFT_EPLRS", Const, 0, ""},
 12417  		{"IFT_ESCON", Const, 0, ""},
 12418  		{"IFT_ETHER", Const, 0, ""},
 12419  		{"IFT_FAITH", Const, 0, ""},
 12420  		{"IFT_FAST", Const, 0, ""},
 12421  		{"IFT_FASTETHER", Const, 0, ""},
 12422  		{"IFT_FASTETHERFX", Const, 0, ""},
 12423  		{"IFT_FDDI", Const, 0, ""},
 12424  		{"IFT_FIBRECHANNEL", Const, 0, ""},
 12425  		{"IFT_FRAMERELAYINTERCONNECT", Const, 0, ""},
 12426  		{"IFT_FRAMERELAYMPI", Const, 0, ""},
 12427  		{"IFT_FRDLCIENDPT", Const, 0, ""},
 12428  		{"IFT_FRELAY", Const, 0, ""},
 12429  		{"IFT_FRELAYDCE", Const, 0, ""},
 12430  		{"IFT_FRF16MFRBUNDLE", Const, 0, ""},
 12431  		{"IFT_FRFORWARD", Const, 0, ""},
 12432  		{"IFT_G703AT2MB", Const, 0, ""},
 12433  		{"IFT_G703AT64K", Const, 0, ""},
 12434  		{"IFT_GIF", Const, 0, ""},
 12435  		{"IFT_GIGABITETHERNET", Const, 0, ""},
 12436  		{"IFT_GR303IDT", Const, 0, ""},
 12437  		{"IFT_GR303RDT", Const, 0, ""},
 12438  		{"IFT_H323GATEKEEPER", Const, 0, ""},
 12439  		{"IFT_H323PROXY", Const, 0, ""},
 12440  		{"IFT_HDH1822", Const, 0, ""},
 12441  		{"IFT_HDLC", Const, 0, ""},
 12442  		{"IFT_HDSL2", Const, 0, ""},
 12443  		{"IFT_HIPERLAN2", Const, 0, ""},
 12444  		{"IFT_HIPPI", Const, 0, ""},
 12445  		{"IFT_HIPPIINTERFACE", Const, 0, ""},
 12446  		{"IFT_HOSTPAD", Const, 0, ""},
 12447  		{"IFT_HSSI", Const, 0, ""},
 12448  		{"IFT_HY", Const, 0, ""},
 12449  		{"IFT_IBM370PARCHAN", Const, 0, ""},
 12450  		{"IFT_IDSL", Const, 0, ""},
 12451  		{"IFT_IEEE1394", Const, 0, ""},
 12452  		{"IFT_IEEE80211", Const, 0, ""},
 12453  		{"IFT_IEEE80212", Const, 0, ""},
 12454  		{"IFT_IEEE8023ADLAG", Const, 0, ""},
 12455  		{"IFT_IFGSN", Const, 0, ""},
 12456  		{"IFT_IMT", Const, 0, ""},
 12457  		{"IFT_INFINIBAND", Const, 1, ""},
 12458  		{"IFT_INTERLEAVE", Const, 0, ""},
 12459  		{"IFT_IP", Const, 0, ""},
 12460  		{"IFT_IPFORWARD", Const, 0, ""},
 12461  		{"IFT_IPOVERATM", Const, 0, ""},
 12462  		{"IFT_IPOVERCDLC", Const, 0, ""},
 12463  		{"IFT_IPOVERCLAW", Const, 0, ""},
 12464  		{"IFT_IPSWITCH", Const, 0, ""},
 12465  		{"IFT_IPXIP", Const, 0, ""},
 12466  		{"IFT_ISDN", Const, 0, ""},
 12467  		{"IFT_ISDNBASIC", Const, 0, ""},
 12468  		{"IFT_ISDNPRIMARY", Const, 0, ""},
 12469  		{"IFT_ISDNS", Const, 0, ""},
 12470  		{"IFT_ISDNU", Const, 0, ""},
 12471  		{"IFT_ISO88022LLC", Const, 0, ""},
 12472  		{"IFT_ISO88023", Const, 0, ""},
 12473  		{"IFT_ISO88024", Const, 0, ""},
 12474  		{"IFT_ISO88025", Const, 0, ""},
 12475  		{"IFT_ISO88025CRFPINT", Const, 0, ""},
 12476  		{"IFT_ISO88025DTR", Const, 0, ""},
 12477  		{"IFT_ISO88025FIBER", Const, 0, ""},
 12478  		{"IFT_ISO88026", Const, 0, ""},
 12479  		{"IFT_ISUP", Const, 0, ""},
 12480  		{"IFT_L2VLAN", Const, 0, ""},
 12481  		{"IFT_L3IPVLAN", Const, 0, ""},
 12482  		{"IFT_L3IPXVLAN", Const, 0, ""},
 12483  		{"IFT_LAPB", Const, 0, ""},
 12484  		{"IFT_LAPD", Const, 0, ""},
 12485  		{"IFT_LAPF", Const, 0, ""},
 12486  		{"IFT_LINEGROUP", Const, 1, ""},
 12487  		{"IFT_LOCALTALK", Const, 0, ""},
 12488  		{"IFT_LOOP", Const, 0, ""},
 12489  		{"IFT_MEDIAMAILOVERIP", Const, 0, ""},
 12490  		{"IFT_MFSIGLINK", Const, 0, ""},
 12491  		{"IFT_MIOX25", Const, 0, ""},
 12492  		{"IFT_MODEM", Const, 0, ""},
 12493  		{"IFT_MPC", Const, 0, ""},
 12494  		{"IFT_MPLS", Const, 0, ""},
 12495  		{"IFT_MPLSTUNNEL", Const, 0, ""},
 12496  		{"IFT_MSDSL", Const, 0, ""},
 12497  		{"IFT_MVL", Const, 0, ""},
 12498  		{"IFT_MYRINET", Const, 0, ""},
 12499  		{"IFT_NFAS", Const, 0, ""},
 12500  		{"IFT_NSIP", Const, 0, ""},
 12501  		{"IFT_OPTICALCHANNEL", Const, 0, ""},
 12502  		{"IFT_OPTICALTRANSPORT", Const, 0, ""},
 12503  		{"IFT_OTHER", Const, 0, ""},
 12504  		{"IFT_P10", Const, 0, ""},
 12505  		{"IFT_P80", Const, 0, ""},
 12506  		{"IFT_PARA", Const, 0, ""},
 12507  		{"IFT_PDP", Const, 0, ""},
 12508  		{"IFT_PFLOG", Const, 0, ""},
 12509  		{"IFT_PFLOW", Const, 1, ""},
 12510  		{"IFT_PFSYNC", Const, 0, ""},
 12511  		{"IFT_PLC", Const, 0, ""},
 12512  		{"IFT_PON155", Const, 1, ""},
 12513  		{"IFT_PON622", Const, 1, ""},
 12514  		{"IFT_POS", Const, 0, ""},
 12515  		{"IFT_PPP", Const, 0, ""},
 12516  		{"IFT_PPPMULTILINKBUNDLE", Const, 0, ""},
 12517  		{"IFT_PROPATM", Const, 1, ""},
 12518  		{"IFT_PROPBWAP2MP", Const, 0, ""},
 12519  		{"IFT_PROPCNLS", Const, 0, ""},
 12520  		{"IFT_PROPDOCSWIRELESSDOWNSTREAM", Const, 0, ""},
 12521  		{"IFT_PROPDOCSWIRELESSMACLAYER", Const, 0, ""},
 12522  		{"IFT_PROPDOCSWIRELESSUPSTREAM", Const, 0, ""},
 12523  		{"IFT_PROPMUX", Const, 0, ""},
 12524  		{"IFT_PROPVIRTUAL", Const, 0, ""},
 12525  		{"IFT_PROPWIRELESSP2P", Const, 0, ""},
 12526  		{"IFT_PTPSERIAL", Const, 0, ""},
 12527  		{"IFT_PVC", Const, 0, ""},
 12528  		{"IFT_Q2931", Const, 1, ""},
 12529  		{"IFT_QLLC", Const, 0, ""},
 12530  		{"IFT_RADIOMAC", Const, 0, ""},
 12531  		{"IFT_RADSL", Const, 0, ""},
 12532  		{"IFT_REACHDSL", Const, 0, ""},
 12533  		{"IFT_RFC1483", Const, 0, ""},
 12534  		{"IFT_RS232", Const, 0, ""},
 12535  		{"IFT_RSRB", Const, 0, ""},
 12536  		{"IFT_SDLC", Const, 0, ""},
 12537  		{"IFT_SDSL", Const, 0, ""},
 12538  		{"IFT_SHDSL", Const, 0, ""},
 12539  		{"IFT_SIP", Const, 0, ""},
 12540  		{"IFT_SIPSIG", Const, 1, ""},
 12541  		{"IFT_SIPTG", Const, 1, ""},
 12542  		{"IFT_SLIP", Const, 0, ""},
 12543  		{"IFT_SMDSDXI", Const, 0, ""},
 12544  		{"IFT_SMDSICIP", Const, 0, ""},
 12545  		{"IFT_SONET", Const, 0, ""},
 12546  		{"IFT_SONETOVERHEADCHANNEL", Const, 0, ""},
 12547  		{"IFT_SONETPATH", Const, 0, ""},
 12548  		{"IFT_SONETVT", Const, 0, ""},
 12549  		{"IFT_SRP", Const, 0, ""},
 12550  		{"IFT_SS7SIGLINK", Const, 0, ""},
 12551  		{"IFT_STACKTOSTACK", Const, 0, ""},
 12552  		{"IFT_STARLAN", Const, 0, ""},
 12553  		{"IFT_STF", Const, 0, ""},
 12554  		{"IFT_T1", Const, 0, ""},
 12555  		{"IFT_TDLC", Const, 0, ""},
 12556  		{"IFT_TELINK", Const, 1, ""},
 12557  		{"IFT_TERMPAD", Const, 0, ""},
 12558  		{"IFT_TR008", Const, 0, ""},
 12559  		{"IFT_TRANSPHDLC", Const, 0, ""},
 12560  		{"IFT_TUNNEL", Const, 0, ""},
 12561  		{"IFT_ULTRA", Const, 0, ""},
 12562  		{"IFT_USB", Const, 0, ""},
 12563  		{"IFT_V11", Const, 0, ""},
 12564  		{"IFT_V35", Const, 0, ""},
 12565  		{"IFT_V36", Const, 0, ""},
 12566  		{"IFT_V37", Const, 0, ""},
 12567  		{"IFT_VDSL", Const, 0, ""},
 12568  		{"IFT_VIRTUALIPADDRESS", Const, 0, ""},
 12569  		{"IFT_VIRTUALTG", Const, 1, ""},
 12570  		{"IFT_VOICEDID", Const, 1, ""},
 12571  		{"IFT_VOICEEM", Const, 0, ""},
 12572  		{"IFT_VOICEEMFGD", Const, 1, ""},
 12573  		{"IFT_VOICEENCAP", Const, 0, ""},
 12574  		{"IFT_VOICEFGDEANA", Const, 1, ""},
 12575  		{"IFT_VOICEFXO", Const, 0, ""},
 12576  		{"IFT_VOICEFXS", Const, 0, ""},
 12577  		{"IFT_VOICEOVERATM", Const, 0, ""},
 12578  		{"IFT_VOICEOVERCABLE", Const, 1, ""},
 12579  		{"IFT_VOICEOVERFRAMERELAY", Const, 0, ""},
 12580  		{"IFT_VOICEOVERIP", Const, 0, ""},
 12581  		{"IFT_X213", Const, 0, ""},
 12582  		{"IFT_X25", Const, 0, ""},
 12583  		{"IFT_X25DDN", Const, 0, ""},
 12584  		{"IFT_X25HUNTGROUP", Const, 0, ""},
 12585  		{"IFT_X25MLP", Const, 0, ""},
 12586  		{"IFT_X25PLE", Const, 0, ""},
 12587  		{"IFT_XETHER", Const, 0, ""},
 12588  		{"IGNBRK", Const, 0, ""},
 12589  		{"IGNCR", Const, 0, ""},
 12590  		{"IGNORE", Const, 0, ""},
 12591  		{"IGNPAR", Const, 0, ""},
 12592  		{"IMAXBEL", Const, 0, ""},
 12593  		{"INFINITE", Const, 0, ""},
 12594  		{"INLCR", Const, 0, ""},
 12595  		{"INPCK", Const, 0, ""},
 12596  		{"INVALID_FILE_ATTRIBUTES", Const, 0, ""},
 12597  		{"IN_ACCESS", Const, 0, ""},
 12598  		{"IN_ALL_EVENTS", Const, 0, ""},
 12599  		{"IN_ATTRIB", Const, 0, ""},
 12600  		{"IN_CLASSA_HOST", Const, 0, ""},
 12601  		{"IN_CLASSA_MAX", Const, 0, ""},
 12602  		{"IN_CLASSA_NET", Const, 0, ""},
 12603  		{"IN_CLASSA_NSHIFT", Const, 0, ""},
 12604  		{"IN_CLASSB_HOST", Const, 0, ""},
 12605  		{"IN_CLASSB_MAX", Const, 0, ""},
 12606  		{"IN_CLASSB_NET", Const, 0, ""},
 12607  		{"IN_CLASSB_NSHIFT", Const, 0, ""},
 12608  		{"IN_CLASSC_HOST", Const, 0, ""},
 12609  		{"IN_CLASSC_NET", Const, 0, ""},
 12610  		{"IN_CLASSC_NSHIFT", Const, 0, ""},
 12611  		{"IN_CLASSD_HOST", Const, 0, ""},
 12612  		{"IN_CLASSD_NET", Const, 0, ""},
 12613  		{"IN_CLASSD_NSHIFT", Const, 0, ""},
 12614  		{"IN_CLOEXEC", Const, 0, ""},
 12615  		{"IN_CLOSE", Const, 0, ""},
 12616  		{"IN_CLOSE_NOWRITE", Const, 0, ""},
 12617  		{"IN_CLOSE_WRITE", Const, 0, ""},
 12618  		{"IN_CREATE", Const, 0, ""},
 12619  		{"IN_DELETE", Const, 0, ""},
 12620  		{"IN_DELETE_SELF", Const, 0, ""},
 12621  		{"IN_DONT_FOLLOW", Const, 0, ""},
 12622  		{"IN_EXCL_UNLINK", Const, 0, ""},
 12623  		{"IN_IGNORED", Const, 0, ""},
 12624  		{"IN_ISDIR", Const, 0, ""},
 12625  		{"IN_LINKLOCALNETNUM", Const, 0, ""},
 12626  		{"IN_LOOPBACKNET", Const, 0, ""},
 12627  		{"IN_MASK_ADD", Const, 0, ""},
 12628  		{"IN_MODIFY", Const, 0, ""},
 12629  		{"IN_MOVE", Const, 0, ""},
 12630  		{"IN_MOVED_FROM", Const, 0, ""},
 12631  		{"IN_MOVED_TO", Const, 0, ""},
 12632  		{"IN_MOVE_SELF", Const, 0, ""},
 12633  		{"IN_NONBLOCK", Const, 0, ""},
 12634  		{"IN_ONESHOT", Const, 0, ""},
 12635  		{"IN_ONLYDIR", Const, 0, ""},
 12636  		{"IN_OPEN", Const, 0, ""},
 12637  		{"IN_Q_OVERFLOW", Const, 0, ""},
 12638  		{"IN_RFC3021_HOST", Const, 1, ""},
 12639  		{"IN_RFC3021_MASK", Const, 1, ""},
 12640  		{"IN_RFC3021_NET", Const, 1, ""},
 12641  		{"IN_RFC3021_NSHIFT", Const, 1, ""},
 12642  		{"IN_UNMOUNT", Const, 0, ""},
 12643  		{"IOC_IN", Const, 1, ""},
 12644  		{"IOC_INOUT", Const, 1, ""},
 12645  		{"IOC_OUT", Const, 1, ""},
 12646  		{"IOC_VENDOR", Const, 3, ""},
 12647  		{"IOC_WS2", Const, 1, ""},
 12648  		{"IO_REPARSE_TAG_SYMLINK", Const, 4, ""},
 12649  		{"IPMreq", Type, 0, ""},
 12650  		{"IPMreq.Interface", Field, 0, ""},
 12651  		{"IPMreq.Multiaddr", Field, 0, ""},
 12652  		{"IPMreqn", Type, 0, ""},
 12653  		{"IPMreqn.Address", Field, 0, ""},
 12654  		{"IPMreqn.Ifindex", Field, 0, ""},
 12655  		{"IPMreqn.Multiaddr", Field, 0, ""},
 12656  		{"IPPROTO_3PC", Const, 0, ""},
 12657  		{"IPPROTO_ADFS", Const, 0, ""},
 12658  		{"IPPROTO_AH", Const, 0, ""},
 12659  		{"IPPROTO_AHIP", Const, 0, ""},
 12660  		{"IPPROTO_APES", Const, 0, ""},
 12661  		{"IPPROTO_ARGUS", Const, 0, ""},
 12662  		{"IPPROTO_AX25", Const, 0, ""},
 12663  		{"IPPROTO_BHA", Const, 0, ""},
 12664  		{"IPPROTO_BLT", Const, 0, ""},
 12665  		{"IPPROTO_BRSATMON", Const, 0, ""},
 12666  		{"IPPROTO_CARP", Const, 0, ""},
 12667  		{"IPPROTO_CFTP", Const, 0, ""},
 12668  		{"IPPROTO_CHAOS", Const, 0, ""},
 12669  		{"IPPROTO_CMTP", Const, 0, ""},
 12670  		{"IPPROTO_COMP", Const, 0, ""},
 12671  		{"IPPROTO_CPHB", Const, 0, ""},
 12672  		{"IPPROTO_CPNX", Const, 0, ""},
 12673  		{"IPPROTO_DCCP", Const, 0, ""},
 12674  		{"IPPROTO_DDP", Const, 0, ""},
 12675  		{"IPPROTO_DGP", Const, 0, ""},
 12676  		{"IPPROTO_DIVERT", Const, 0, ""},
 12677  		{"IPPROTO_DIVERT_INIT", Const, 3, ""},
 12678  		{"IPPROTO_DIVERT_RESP", Const, 3, ""},
 12679  		{"IPPROTO_DONE", Const, 0, ""},
 12680  		{"IPPROTO_DSTOPTS", Const, 0, ""},
 12681  		{"IPPROTO_EGP", Const, 0, ""},
 12682  		{"IPPROTO_EMCON", Const, 0, ""},
 12683  		{"IPPROTO_ENCAP", Const, 0, ""},
 12684  		{"IPPROTO_EON", Const, 0, ""},
 12685  		{"IPPROTO_ESP", Const, 0, ""},
 12686  		{"IPPROTO_ETHERIP", Const, 0, ""},
 12687  		{"IPPROTO_FRAGMENT", Const, 0, ""},
 12688  		{"IPPROTO_GGP", Const, 0, ""},
 12689  		{"IPPROTO_GMTP", Const, 0, ""},
 12690  		{"IPPROTO_GRE", Const, 0, ""},
 12691  		{"IPPROTO_HELLO", Const, 0, ""},
 12692  		{"IPPROTO_HMP", Const, 0, ""},
 12693  		{"IPPROTO_HOPOPTS", Const, 0, ""},
 12694  		{"IPPROTO_ICMP", Const, 0, ""},
 12695  		{"IPPROTO_ICMPV6", Const, 0, ""},
 12696  		{"IPPROTO_IDP", Const, 0, ""},
 12697  		{"IPPROTO_IDPR", Const, 0, ""},
 12698  		{"IPPROTO_IDRP", Const, 0, ""},
 12699  		{"IPPROTO_IGMP", Const, 0, ""},
 12700  		{"IPPROTO_IGP", Const, 0, ""},
 12701  		{"IPPROTO_IGRP", Const, 0, ""},
 12702  		{"IPPROTO_IL", Const, 0, ""},
 12703  		{"IPPROTO_INLSP", Const, 0, ""},
 12704  		{"IPPROTO_INP", Const, 0, ""},
 12705  		{"IPPROTO_IP", Const, 0, ""},
 12706  		{"IPPROTO_IPCOMP", Const, 0, ""},
 12707  		{"IPPROTO_IPCV", Const, 0, ""},
 12708  		{"IPPROTO_IPEIP", Const, 0, ""},
 12709  		{"IPPROTO_IPIP", Const, 0, ""},
 12710  		{"IPPROTO_IPPC", Const, 0, ""},
 12711  		{"IPPROTO_IPV4", Const, 0, ""},
 12712  		{"IPPROTO_IPV6", Const, 0, ""},
 12713  		{"IPPROTO_IPV6_ICMP", Const, 1, ""},
 12714  		{"IPPROTO_IRTP", Const, 0, ""},
 12715  		{"IPPROTO_KRYPTOLAN", Const, 0, ""},
 12716  		{"IPPROTO_LARP", Const, 0, ""},
 12717  		{"IPPROTO_LEAF1", Const, 0, ""},
 12718  		{"IPPROTO_LEAF2", Const, 0, ""},
 12719  		{"IPPROTO_MAX", Const, 0, ""},
 12720  		{"IPPROTO_MAXID", Const, 0, ""},
 12721  		{"IPPROTO_MEAS", Const, 0, ""},
 12722  		{"IPPROTO_MH", Const, 1, ""},
 12723  		{"IPPROTO_MHRP", Const, 0, ""},
 12724  		{"IPPROTO_MICP", Const, 0, ""},
 12725  		{"IPPROTO_MOBILE", Const, 0, ""},
 12726  		{"IPPROTO_MPLS", Const, 1, ""},
 12727  		{"IPPROTO_MTP", Const, 0, ""},
 12728  		{"IPPROTO_MUX", Const, 0, ""},
 12729  		{"IPPROTO_ND", Const, 0, ""},
 12730  		{"IPPROTO_NHRP", Const, 0, ""},
 12731  		{"IPPROTO_NONE", Const, 0, ""},
 12732  		{"IPPROTO_NSP", Const, 0, ""},
 12733  		{"IPPROTO_NVPII", Const, 0, ""},
 12734  		{"IPPROTO_OLD_DIVERT", Const, 0, ""},
 12735  		{"IPPROTO_OSPFIGP", Const, 0, ""},
 12736  		{"IPPROTO_PFSYNC", Const, 0, ""},
 12737  		{"IPPROTO_PGM", Const, 0, ""},
 12738  		{"IPPROTO_PIGP", Const, 0, ""},
 12739  		{"IPPROTO_PIM", Const, 0, ""},
 12740  		{"IPPROTO_PRM", Const, 0, ""},
 12741  		{"IPPROTO_PUP", Const, 0, ""},
 12742  		{"IPPROTO_PVP", Const, 0, ""},
 12743  		{"IPPROTO_RAW", Const, 0, ""},
 12744  		{"IPPROTO_RCCMON", Const, 0, ""},
 12745  		{"IPPROTO_RDP", Const, 0, ""},
 12746  		{"IPPROTO_ROUTING", Const, 0, ""},
 12747  		{"IPPROTO_RSVP", Const, 0, ""},
 12748  		{"IPPROTO_RVD", Const, 0, ""},
 12749  		{"IPPROTO_SATEXPAK", Const, 0, ""},
 12750  		{"IPPROTO_SATMON", Const, 0, ""},
 12751  		{"IPPROTO_SCCSP", Const, 0, ""},
 12752  		{"IPPROTO_SCTP", Const, 0, ""},
 12753  		{"IPPROTO_SDRP", Const, 0, ""},
 12754  		{"IPPROTO_SEND", Const, 1, ""},
 12755  		{"IPPROTO_SEP", Const, 0, ""},
 12756  		{"IPPROTO_SKIP", Const, 0, ""},
 12757  		{"IPPROTO_SPACER", Const, 0, ""},
 12758  		{"IPPROTO_SRPC", Const, 0, ""},
 12759  		{"IPPROTO_ST", Const, 0, ""},
 12760  		{"IPPROTO_SVMTP", Const, 0, ""},
 12761  		{"IPPROTO_SWIPE", Const, 0, ""},
 12762  		{"IPPROTO_TCF", Const, 0, ""},
 12763  		{"IPPROTO_TCP", Const, 0, ""},
 12764  		{"IPPROTO_TLSP", Const, 0, ""},
 12765  		{"IPPROTO_TP", Const, 0, ""},
 12766  		{"IPPROTO_TPXX", Const, 0, ""},
 12767  		{"IPPROTO_TRUNK1", Const, 0, ""},
 12768  		{"IPPROTO_TRUNK2", Const, 0, ""},
 12769  		{"IPPROTO_TTP", Const, 0, ""},
 12770  		{"IPPROTO_UDP", Const, 0, ""},
 12771  		{"IPPROTO_UDPLITE", Const, 0, ""},
 12772  		{"IPPROTO_VINES", Const, 0, ""},
 12773  		{"IPPROTO_VISA", Const, 0, ""},
 12774  		{"IPPROTO_VMTP", Const, 0, ""},
 12775  		{"IPPROTO_VRRP", Const, 1, ""},
 12776  		{"IPPROTO_WBEXPAK", Const, 0, ""},
 12777  		{"IPPROTO_WBMON", Const, 0, ""},
 12778  		{"IPPROTO_WSN", Const, 0, ""},
 12779  		{"IPPROTO_XNET", Const, 0, ""},
 12780  		{"IPPROTO_XTP", Const, 0, ""},
 12781  		{"IPV6_2292DSTOPTS", Const, 0, ""},
 12782  		{"IPV6_2292HOPLIMIT", Const, 0, ""},
 12783  		{"IPV6_2292HOPOPTS", Const, 0, ""},
 12784  		{"IPV6_2292NEXTHOP", Const, 0, ""},
 12785  		{"IPV6_2292PKTINFO", Const, 0, ""},
 12786  		{"IPV6_2292PKTOPTIONS", Const, 0, ""},
 12787  		{"IPV6_2292RTHDR", Const, 0, ""},
 12788  		{"IPV6_ADDRFORM", Const, 0, ""},
 12789  		{"IPV6_ADD_MEMBERSHIP", Const, 0, ""},
 12790  		{"IPV6_AUTHHDR", Const, 0, ""},
 12791  		{"IPV6_AUTH_LEVEL", Const, 1, ""},
 12792  		{"IPV6_AUTOFLOWLABEL", Const, 0, ""},
 12793  		{"IPV6_BINDANY", Const, 0, ""},
 12794  		{"IPV6_BINDV6ONLY", Const, 0, ""},
 12795  		{"IPV6_BOUND_IF", Const, 0, ""},
 12796  		{"IPV6_CHECKSUM", Const, 0, ""},
 12797  		{"IPV6_DEFAULT_MULTICAST_HOPS", Const, 0, ""},
 12798  		{"IPV6_DEFAULT_MULTICAST_LOOP", Const, 0, ""},
 12799  		{"IPV6_DEFHLIM", Const, 0, ""},
 12800  		{"IPV6_DONTFRAG", Const, 0, ""},
 12801  		{"IPV6_DROP_MEMBERSHIP", Const, 0, ""},
 12802  		{"IPV6_DSTOPTS", Const, 0, ""},
 12803  		{"IPV6_ESP_NETWORK_LEVEL", Const, 1, ""},
 12804  		{"IPV6_ESP_TRANS_LEVEL", Const, 1, ""},
 12805  		{"IPV6_FAITH", Const, 0, ""},
 12806  		{"IPV6_FLOWINFO_MASK", Const, 0, ""},
 12807  		{"IPV6_FLOWLABEL_MASK", Const, 0, ""},
 12808  		{"IPV6_FRAGTTL", Const, 0, ""},
 12809  		{"IPV6_FW_ADD", Const, 0, ""},
 12810  		{"IPV6_FW_DEL", Const, 0, ""},
 12811  		{"IPV6_FW_FLUSH", Const, 0, ""},
 12812  		{"IPV6_FW_GET", Const, 0, ""},
 12813  		{"IPV6_FW_ZERO", Const, 0, ""},
 12814  		{"IPV6_HLIMDEC", Const, 0, ""},
 12815  		{"IPV6_HOPLIMIT", Const, 0, ""},
 12816  		{"IPV6_HOPOPTS", Const, 0, ""},
 12817  		{"IPV6_IPCOMP_LEVEL", Const, 1, ""},
 12818  		{"IPV6_IPSEC_POLICY", Const, 0, ""},
 12819  		{"IPV6_JOIN_ANYCAST", Const, 0, ""},
 12820  		{"IPV6_JOIN_GROUP", Const, 0, ""},
 12821  		{"IPV6_LEAVE_ANYCAST", Const, 0, ""},
 12822  		{"IPV6_LEAVE_GROUP", Const, 0, ""},
 12823  		{"IPV6_MAXHLIM", Const, 0, ""},
 12824  		{"IPV6_MAXOPTHDR", Const, 0, ""},
 12825  		{"IPV6_MAXPACKET", Const, 0, ""},
 12826  		{"IPV6_MAX_GROUP_SRC_FILTER", Const, 0, ""},
 12827  		{"IPV6_MAX_MEMBERSHIPS", Const, 0, ""},
 12828  		{"IPV6_MAX_SOCK_SRC_FILTER", Const, 0, ""},
 12829  		{"IPV6_MIN_MEMBERSHIPS", Const, 0, ""},
 12830  		{"IPV6_MMTU", Const, 0, ""},
 12831  		{"IPV6_MSFILTER", Const, 0, ""},
 12832  		{"IPV6_MTU", Const, 0, ""},
 12833  		{"IPV6_MTU_DISCOVER", Const, 0, ""},
 12834  		{"IPV6_MULTICAST_HOPS", Const, 0, ""},
 12835  		{"IPV6_MULTICAST_IF", Const, 0, ""},
 12836  		{"IPV6_MULTICAST_LOOP", Const, 0, ""},
 12837  		{"IPV6_NEXTHOP", Const, 0, ""},
 12838  		{"IPV6_OPTIONS", Const, 1, ""},
 12839  		{"IPV6_PATHMTU", Const, 0, ""},
 12840  		{"IPV6_PIPEX", Const, 1, ""},
 12841  		{"IPV6_PKTINFO", Const, 0, ""},
 12842  		{"IPV6_PMTUDISC_DO", Const, 0, ""},
 12843  		{"IPV6_PMTUDISC_DONT", Const, 0, ""},
 12844  		{"IPV6_PMTUDISC_PROBE", Const, 0, ""},
 12845  		{"IPV6_PMTUDISC_WANT", Const, 0, ""},
 12846  		{"IPV6_PORTRANGE", Const, 0, ""},
 12847  		{"IPV6_PORTRANGE_DEFAULT", Const, 0, ""},
 12848  		{"IPV6_PORTRANGE_HIGH", Const, 0, ""},
 12849  		{"IPV6_PORTRANGE_LOW", Const, 0, ""},
 12850  		{"IPV6_PREFER_TEMPADDR", Const, 0, ""},
 12851  		{"IPV6_RECVDSTOPTS", Const, 0, ""},
 12852  		{"IPV6_RECVDSTPORT", Const, 3, ""},
 12853  		{"IPV6_RECVERR", Const, 0, ""},
 12854  		{"IPV6_RECVHOPLIMIT", Const, 0, ""},
 12855  		{"IPV6_RECVHOPOPTS", Const, 0, ""},
 12856  		{"IPV6_RECVPATHMTU", Const, 0, ""},
 12857  		{"IPV6_RECVPKTINFO", Const, 0, ""},
 12858  		{"IPV6_RECVRTHDR", Const, 0, ""},
 12859  		{"IPV6_RECVTCLASS", Const, 0, ""},
 12860  		{"IPV6_ROUTER_ALERT", Const, 0, ""},
 12861  		{"IPV6_RTABLE", Const, 1, ""},
 12862  		{"IPV6_RTHDR", Const, 0, ""},
 12863  		{"IPV6_RTHDRDSTOPTS", Const, 0, ""},
 12864  		{"IPV6_RTHDR_LOOSE", Const, 0, ""},
 12865  		{"IPV6_RTHDR_STRICT", Const, 0, ""},
 12866  		{"IPV6_RTHDR_TYPE_0", Const, 0, ""},
 12867  		{"IPV6_RXDSTOPTS", Const, 0, ""},
 12868  		{"IPV6_RXHOPOPTS", Const, 0, ""},
 12869  		{"IPV6_SOCKOPT_RESERVED1", Const, 0, ""},
 12870  		{"IPV6_TCLASS", Const, 0, ""},
 12871  		{"IPV6_UNICAST_HOPS", Const, 0, ""},
 12872  		{"IPV6_USE_MIN_MTU", Const, 0, ""},
 12873  		{"IPV6_V6ONLY", Const, 0, ""},
 12874  		{"IPV6_VERSION", Const, 0, ""},
 12875  		{"IPV6_VERSION_MASK", Const, 0, ""},
 12876  		{"IPV6_XFRM_POLICY", Const, 0, ""},
 12877  		{"IP_ADD_MEMBERSHIP", Const, 0, ""},
 12878  		{"IP_ADD_SOURCE_MEMBERSHIP", Const, 0, ""},
 12879  		{"IP_AUTH_LEVEL", Const, 1, ""},
 12880  		{"IP_BINDANY", Const, 0, ""},
 12881  		{"IP_BLOCK_SOURCE", Const, 0, ""},
 12882  		{"IP_BOUND_IF", Const, 0, ""},
 12883  		{"IP_DEFAULT_MULTICAST_LOOP", Const, 0, ""},
 12884  		{"IP_DEFAULT_MULTICAST_TTL", Const, 0, ""},
 12885  		{"IP_DF", Const, 0, ""},
 12886  		{"IP_DIVERTFL", Const, 3, ""},
 12887  		{"IP_DONTFRAG", Const, 0, ""},
 12888  		{"IP_DROP_MEMBERSHIP", Const, 0, ""},
 12889  		{"IP_DROP_SOURCE_MEMBERSHIP", Const, 0, ""},
 12890  		{"IP_DUMMYNET3", Const, 0, ""},
 12891  		{"IP_DUMMYNET_CONFIGURE", Const, 0, ""},
 12892  		{"IP_DUMMYNET_DEL", Const, 0, ""},
 12893  		{"IP_DUMMYNET_FLUSH", Const, 0, ""},
 12894  		{"IP_DUMMYNET_GET", Const, 0, ""},
 12895  		{"IP_EF", Const, 1, ""},
 12896  		{"IP_ERRORMTU", Const, 1, ""},
 12897  		{"IP_ESP_NETWORK_LEVEL", Const, 1, ""},
 12898  		{"IP_ESP_TRANS_LEVEL", Const, 1, ""},
 12899  		{"IP_FAITH", Const, 0, ""},
 12900  		{"IP_FREEBIND", Const, 0, ""},
 12901  		{"IP_FW3", Const, 0, ""},
 12902  		{"IP_FW_ADD", Const, 0, ""},
 12903  		{"IP_FW_DEL", Const, 0, ""},
 12904  		{"IP_FW_FLUSH", Const, 0, ""},
 12905  		{"IP_FW_GET", Const, 0, ""},
 12906  		{"IP_FW_NAT_CFG", Const, 0, ""},
 12907  		{"IP_FW_NAT_DEL", Const, 0, ""},
 12908  		{"IP_FW_NAT_GET_CONFIG", Const, 0, ""},
 12909  		{"IP_FW_NAT_GET_LOG", Const, 0, ""},
 12910  		{"IP_FW_RESETLOG", Const, 0, ""},
 12911  		{"IP_FW_TABLE_ADD", Const, 0, ""},
 12912  		{"IP_FW_TABLE_DEL", Const, 0, ""},
 12913  		{"IP_FW_TABLE_FLUSH", Const, 0, ""},
 12914  		{"IP_FW_TABLE_GETSIZE", Const, 0, ""},
 12915  		{"IP_FW_TABLE_LIST", Const, 0, ""},
 12916  		{"IP_FW_ZERO", Const, 0, ""},
 12917  		{"IP_HDRINCL", Const, 0, ""},
 12918  		{"IP_IPCOMP_LEVEL", Const, 1, ""},
 12919  		{"IP_IPSECFLOWINFO", Const, 1, ""},
 12920  		{"IP_IPSEC_LOCAL_AUTH", Const, 1, ""},
 12921  		{"IP_IPSEC_LOCAL_CRED", Const, 1, ""},
 12922  		{"IP_IPSEC_LOCAL_ID", Const, 1, ""},
 12923  		{"IP_IPSEC_POLICY", Const, 0, ""},
 12924  		{"IP_IPSEC_REMOTE_AUTH", Const, 1, ""},
 12925  		{"IP_IPSEC_REMOTE_CRED", Const, 1, ""},
 12926  		{"IP_IPSEC_REMOTE_ID", Const, 1, ""},
 12927  		{"IP_MAXPACKET", Const, 0, ""},
 12928  		{"IP_MAX_GROUP_SRC_FILTER", Const, 0, ""},
 12929  		{"IP_MAX_MEMBERSHIPS", Const, 0, ""},
 12930  		{"IP_MAX_SOCK_MUTE_FILTER", Const, 0, ""},
 12931  		{"IP_MAX_SOCK_SRC_FILTER", Const, 0, ""},
 12932  		{"IP_MAX_SOURCE_FILTER", Const, 0, ""},
 12933  		{"IP_MF", Const, 0, ""},
 12934  		{"IP_MINFRAGSIZE", Const, 1, ""},
 12935  		{"IP_MINTTL", Const, 0, ""},
 12936  		{"IP_MIN_MEMBERSHIPS", Const, 0, ""},
 12937  		{"IP_MSFILTER", Const, 0, ""},
 12938  		{"IP_MSS", Const, 0, ""},
 12939  		{"IP_MTU", Const, 0, ""},
 12940  		{"IP_MTU_DISCOVER", Const, 0, ""},
 12941  		{"IP_MULTICAST_IF", Const, 0, ""},
 12942  		{"IP_MULTICAST_IFINDEX", Const, 0, ""},
 12943  		{"IP_MULTICAST_LOOP", Const, 0, ""},
 12944  		{"IP_MULTICAST_TTL", Const, 0, ""},
 12945  		{"IP_MULTICAST_VIF", Const, 0, ""},
 12946  		{"IP_NAT__XXX", Const, 0, ""},
 12947  		{"IP_OFFMASK", Const, 0, ""},
 12948  		{"IP_OLD_FW_ADD", Const, 0, ""},
 12949  		{"IP_OLD_FW_DEL", Const, 0, ""},
 12950  		{"IP_OLD_FW_FLUSH", Const, 0, ""},
 12951  		{"IP_OLD_FW_GET", Const, 0, ""},
 12952  		{"IP_OLD_FW_RESETLOG", Const, 0, ""},
 12953  		{"IP_OLD_FW_ZERO", Const, 0, ""},
 12954  		{"IP_ONESBCAST", Const, 0, ""},
 12955  		{"IP_OPTIONS", Const, 0, ""},
 12956  		{"IP_ORIGDSTADDR", Const, 0, ""},
 12957  		{"IP_PASSSEC", Const, 0, ""},
 12958  		{"IP_PIPEX", Const, 1, ""},
 12959  		{"IP_PKTINFO", Const, 0, ""},
 12960  		{"IP_PKTOPTIONS", Const, 0, ""},
 12961  		{"IP_PMTUDISC", Const, 0, ""},
 12962  		{"IP_PMTUDISC_DO", Const, 0, ""},
 12963  		{"IP_PMTUDISC_DONT", Const, 0, ""},
 12964  		{"IP_PMTUDISC_PROBE", Const, 0, ""},
 12965  		{"IP_PMTUDISC_WANT", Const, 0, ""},
 12966  		{"IP_PORTRANGE", Const, 0, ""},
 12967  		{"IP_PORTRANGE_DEFAULT", Const, 0, ""},
 12968  		{"IP_PORTRANGE_HIGH", Const, 0, ""},
 12969  		{"IP_PORTRANGE_LOW", Const, 0, ""},
 12970  		{"IP_RECVDSTADDR", Const, 0, ""},
 12971  		{"IP_RECVDSTPORT", Const, 1, ""},
 12972  		{"IP_RECVERR", Const, 0, ""},
 12973  		{"IP_RECVIF", Const, 0, ""},
 12974  		{"IP_RECVOPTS", Const, 0, ""},
 12975  		{"IP_RECVORIGDSTADDR", Const, 0, ""},
 12976  		{"IP_RECVPKTINFO", Const, 0, ""},
 12977  		{"IP_RECVRETOPTS", Const, 0, ""},
 12978  		{"IP_RECVRTABLE", Const, 1, ""},
 12979  		{"IP_RECVTOS", Const, 0, ""},
 12980  		{"IP_RECVTTL", Const, 0, ""},
 12981  		{"IP_RETOPTS", Const, 0, ""},
 12982  		{"IP_RF", Const, 0, ""},
 12983  		{"IP_ROUTER_ALERT", Const, 0, ""},
 12984  		{"IP_RSVP_OFF", Const, 0, ""},
 12985  		{"IP_RSVP_ON", Const, 0, ""},
 12986  		{"IP_RSVP_VIF_OFF", Const, 0, ""},
 12987  		{"IP_RSVP_VIF_ON", Const, 0, ""},
 12988  		{"IP_RTABLE", Const, 1, ""},
 12989  		{"IP_SENDSRCADDR", Const, 0, ""},
 12990  		{"IP_STRIPHDR", Const, 0, ""},
 12991  		{"IP_TOS", Const, 0, ""},
 12992  		{"IP_TRAFFIC_MGT_BACKGROUND", Const, 0, ""},
 12993  		{"IP_TRANSPARENT", Const, 0, ""},
 12994  		{"IP_TTL", Const, 0, ""},
 12995  		{"IP_UNBLOCK_SOURCE", Const, 0, ""},
 12996  		{"IP_XFRM_POLICY", Const, 0, ""},
 12997  		{"IPv6MTUInfo", Type, 2, ""},
 12998  		{"IPv6MTUInfo.Addr", Field, 2, ""},
 12999  		{"IPv6MTUInfo.Mtu", Field, 2, ""},
 13000  		{"IPv6Mreq", Type, 0, ""},
 13001  		{"IPv6Mreq.Interface", Field, 0, ""},
 13002  		{"IPv6Mreq.Multiaddr", Field, 0, ""},
 13003  		{"ISIG", Const, 0, ""},
 13004  		{"ISTRIP", Const, 0, ""},
 13005  		{"IUCLC", Const, 0, ""},
 13006  		{"IUTF8", Const, 0, ""},
 13007  		{"IXANY", Const, 0, ""},
 13008  		{"IXOFF", Const, 0, ""},
 13009  		{"IXON", Const, 0, ""},
 13010  		{"IfAddrmsg", Type, 0, ""},
 13011  		{"IfAddrmsg.Family", Field, 0, ""},
 13012  		{"IfAddrmsg.Flags", Field, 0, ""},
 13013  		{"IfAddrmsg.Index", Field, 0, ""},
 13014  		{"IfAddrmsg.Prefixlen", Field, 0, ""},
 13015  		{"IfAddrmsg.Scope", Field, 0, ""},
 13016  		{"IfAnnounceMsghdr", Type, 1, ""},
 13017  		{"IfAnnounceMsghdr.Hdrlen", Field, 2, ""},
 13018  		{"IfAnnounceMsghdr.Index", Field, 1, ""},
 13019  		{"IfAnnounceMsghdr.Msglen", Field, 1, ""},
 13020  		{"IfAnnounceMsghdr.Name", Field, 1, ""},
 13021  		{"IfAnnounceMsghdr.Type", Field, 1, ""},
 13022  		{"IfAnnounceMsghdr.Version", Field, 1, ""},
 13023  		{"IfAnnounceMsghdr.What", Field, 1, ""},
 13024  		{"IfData", Type, 0, ""},
 13025  		{"IfData.Addrlen", Field, 0, ""},
 13026  		{"IfData.Baudrate", Field, 0, ""},
 13027  		{"IfData.Capabilities", Field, 2, ""},
 13028  		{"IfData.Collisions", Field, 0, ""},
 13029  		{"IfData.Datalen", Field, 0, ""},
 13030  		{"IfData.Epoch", Field, 0, ""},
 13031  		{"IfData.Hdrlen", Field, 0, ""},
 13032  		{"IfData.Hwassist", Field, 0, ""},
 13033  		{"IfData.Ibytes", Field, 0, ""},
 13034  		{"IfData.Ierrors", Field, 0, ""},
 13035  		{"IfData.Imcasts", Field, 0, ""},
 13036  		{"IfData.Ipackets", Field, 0, ""},
 13037  		{"IfData.Iqdrops", Field, 0, ""},
 13038  		{"IfData.Lastchange", Field, 0, ""},
 13039  		{"IfData.Link_state", Field, 0, ""},
 13040  		{"IfData.Mclpool", Field, 2, ""},
 13041  		{"IfData.Metric", Field, 0, ""},
 13042  		{"IfData.Mtu", Field, 0, ""},
 13043  		{"IfData.Noproto", Field, 0, ""},
 13044  		{"IfData.Obytes", Field, 0, ""},
 13045  		{"IfData.Oerrors", Field, 0, ""},
 13046  		{"IfData.Omcasts", Field, 0, ""},
 13047  		{"IfData.Opackets", Field, 0, ""},
 13048  		{"IfData.Pad", Field, 2, ""},
 13049  		{"IfData.Pad_cgo_0", Field, 2, ""},
 13050  		{"IfData.Pad_cgo_1", Field, 2, ""},
 13051  		{"IfData.Physical", Field, 0, ""},
 13052  		{"IfData.Recvquota", Field, 0, ""},
 13053  		{"IfData.Recvtiming", Field, 0, ""},
 13054  		{"IfData.Reserved1", Field, 0, ""},
 13055  		{"IfData.Reserved2", Field, 0, ""},
 13056  		{"IfData.Spare_char1", Field, 0, ""},
 13057  		{"IfData.Spare_char2", Field, 0, ""},
 13058  		{"IfData.Type", Field, 0, ""},
 13059  		{"IfData.Typelen", Field, 0, ""},
 13060  		{"IfData.Unused1", Field, 0, ""},
 13061  		{"IfData.Unused2", Field, 0, ""},
 13062  		{"IfData.Xmitquota", Field, 0, ""},
 13063  		{"IfData.Xmittiming", Field, 0, ""},
 13064  		{"IfInfomsg", Type, 0, ""},
 13065  		{"IfInfomsg.Change", Field, 0, ""},
 13066  		{"IfInfomsg.Family", Field, 0, ""},
 13067  		{"IfInfomsg.Flags", Field, 0, ""},
 13068  		{"IfInfomsg.Index", Field, 0, ""},
 13069  		{"IfInfomsg.Type", Field, 0, ""},
 13070  		{"IfInfomsg.X__ifi_pad", Field, 0, ""},
 13071  		{"IfMsghdr", Type, 0, ""},
 13072  		{"IfMsghdr.Addrs", Field, 0, ""},
 13073  		{"IfMsghdr.Data", Field, 0, ""},
 13074  		{"IfMsghdr.Flags", Field, 0, ""},
 13075  		{"IfMsghdr.Hdrlen", Field, 2, ""},
 13076  		{"IfMsghdr.Index", Field, 0, ""},
 13077  		{"IfMsghdr.Msglen", Field, 0, ""},
 13078  		{"IfMsghdr.Pad1", Field, 2, ""},
 13079  		{"IfMsghdr.Pad2", Field, 2, ""},
 13080  		{"IfMsghdr.Pad_cgo_0", Field, 0, ""},
 13081  		{"IfMsghdr.Pad_cgo_1", Field, 2, ""},
 13082  		{"IfMsghdr.Tableid", Field, 2, ""},
 13083  		{"IfMsghdr.Type", Field, 0, ""},
 13084  		{"IfMsghdr.Version", Field, 0, ""},
 13085  		{"IfMsghdr.Xflags", Field, 2, ""},
 13086  		{"IfaMsghdr", Type, 0, ""},
 13087  		{"IfaMsghdr.Addrs", Field, 0, ""},
 13088  		{"IfaMsghdr.Flags", Field, 0, ""},
 13089  		{"IfaMsghdr.Hdrlen", Field, 2, ""},
 13090  		{"IfaMsghdr.Index", Field, 0, ""},
 13091  		{"IfaMsghdr.Metric", Field, 0, ""},
 13092  		{"IfaMsghdr.Msglen", Field, 0, ""},
 13093  		{"IfaMsghdr.Pad1", Field, 2, ""},
 13094  		{"IfaMsghdr.Pad2", Field, 2, ""},
 13095  		{"IfaMsghdr.Pad_cgo_0", Field, 0, ""},
 13096  		{"IfaMsghdr.Tableid", Field, 2, ""},
 13097  		{"IfaMsghdr.Type", Field, 0, ""},
 13098  		{"IfaMsghdr.Version", Field, 0, ""},
 13099  		{"IfmaMsghdr", Type, 0, ""},
 13100  		{"IfmaMsghdr.Addrs", Field, 0, ""},
 13101  		{"IfmaMsghdr.Flags", Field, 0, ""},
 13102  		{"IfmaMsghdr.Index", Field, 0, ""},
 13103  		{"IfmaMsghdr.Msglen", Field, 0, ""},
 13104  		{"IfmaMsghdr.Pad_cgo_0", Field, 0, ""},
 13105  		{"IfmaMsghdr.Type", Field, 0, ""},
 13106  		{"IfmaMsghdr.Version", Field, 0, ""},
 13107  		{"IfmaMsghdr2", Type, 0, ""},
 13108  		{"IfmaMsghdr2.Addrs", Field, 0, ""},
 13109  		{"IfmaMsghdr2.Flags", Field, 0, ""},
 13110  		{"IfmaMsghdr2.Index", Field, 0, ""},
 13111  		{"IfmaMsghdr2.Msglen", Field, 0, ""},
 13112  		{"IfmaMsghdr2.Pad_cgo_0", Field, 0, ""},
 13113  		{"IfmaMsghdr2.Refcount", Field, 0, ""},
 13114  		{"IfmaMsghdr2.Type", Field, 0, ""},
 13115  		{"IfmaMsghdr2.Version", Field, 0, ""},
 13116  		{"ImplementsGetwd", Const, 0, ""},
 13117  		{"Inet4Pktinfo", Type, 0, ""},
 13118  		{"Inet4Pktinfo.Addr", Field, 0, ""},
 13119  		{"Inet4Pktinfo.Ifindex", Field, 0, ""},
 13120  		{"Inet4Pktinfo.Spec_dst", Field, 0, ""},
 13121  		{"Inet6Pktinfo", Type, 0, ""},
 13122  		{"Inet6Pktinfo.Addr", Field, 0, ""},
 13123  		{"Inet6Pktinfo.Ifindex", Field, 0, ""},
 13124  		{"InotifyAddWatch", Func, 0, "func(fd int, pathname string, mask uint32) (watchdesc int, err error)"},
 13125  		{"InotifyEvent", Type, 0, ""},
 13126  		{"InotifyEvent.Cookie", Field, 0, ""},
 13127  		{"InotifyEvent.Len", Field, 0, ""},
 13128  		{"InotifyEvent.Mask", Field, 0, ""},
 13129  		{"InotifyEvent.Name", Field, 0, ""},
 13130  		{"InotifyEvent.Wd", Field, 0, ""},
 13131  		{"InotifyInit", Func, 0, "func() (fd int, err error)"},
 13132  		{"InotifyInit1", Func, 0, "func(flags int) (fd int, err error)"},
 13133  		{"InotifyRmWatch", Func, 0, "func(fd int, watchdesc uint32) (success int, err error)"},
 13134  		{"InterfaceAddrMessage", Type, 0, ""},
 13135  		{"InterfaceAddrMessage.Data", Field, 0, ""},
 13136  		{"InterfaceAddrMessage.Header", Field, 0, ""},
 13137  		{"InterfaceAnnounceMessage", Type, 1, ""},
 13138  		{"InterfaceAnnounceMessage.Header", Field, 1, ""},
 13139  		{"InterfaceInfo", Type, 0, ""},
 13140  		{"InterfaceInfo.Address", Field, 0, ""},
 13141  		{"InterfaceInfo.BroadcastAddress", Field, 0, ""},
 13142  		{"InterfaceInfo.Flags", Field, 0, ""},
 13143  		{"InterfaceInfo.Netmask", Field, 0, ""},
 13144  		{"InterfaceMessage", Type, 0, ""},
 13145  		{"InterfaceMessage.Data", Field, 0, ""},
 13146  		{"InterfaceMessage.Header", Field, 0, ""},
 13147  		{"InterfaceMulticastAddrMessage", Type, 0, ""},
 13148  		{"InterfaceMulticastAddrMessage.Data", Field, 0, ""},
 13149  		{"InterfaceMulticastAddrMessage.Header", Field, 0, ""},
 13150  		{"InvalidHandle", Const, 0, ""},
 13151  		{"Ioperm", Func, 0, "func(from int, num int, on int) (err error)"},
 13152  		{"Iopl", Func, 0, "func(level int) (err error)"},
 13153  		{"Iovec", Type, 0, ""},
 13154  		{"Iovec.Base", Field, 0, ""},
 13155  		{"Iovec.Len", Field, 0, ""},
 13156  		{"IpAdapterInfo", Type, 0, ""},
 13157  		{"IpAdapterInfo.AdapterName", Field, 0, ""},
 13158  		{"IpAdapterInfo.Address", Field, 0, ""},
 13159  		{"IpAdapterInfo.AddressLength", Field, 0, ""},
 13160  		{"IpAdapterInfo.ComboIndex", Field, 0, ""},
 13161  		{"IpAdapterInfo.CurrentIpAddress", Field, 0, ""},
 13162  		{"IpAdapterInfo.Description", Field, 0, ""},
 13163  		{"IpAdapterInfo.DhcpEnabled", Field, 0, ""},
 13164  		{"IpAdapterInfo.DhcpServer", Field, 0, ""},
 13165  		{"IpAdapterInfo.GatewayList", Field, 0, ""},
 13166  		{"IpAdapterInfo.HaveWins", Field, 0, ""},
 13167  		{"IpAdapterInfo.Index", Field, 0, ""},
 13168  		{"IpAdapterInfo.IpAddressList", Field, 0, ""},
 13169  		{"IpAdapterInfo.LeaseExpires", Field, 0, ""},
 13170  		{"IpAdapterInfo.LeaseObtained", Field, 0, ""},
 13171  		{"IpAdapterInfo.Next", Field, 0, ""},
 13172  		{"IpAdapterInfo.PrimaryWinsServer", Field, 0, ""},
 13173  		{"IpAdapterInfo.SecondaryWinsServer", Field, 0, ""},
 13174  		{"IpAdapterInfo.Type", Field, 0, ""},
 13175  		{"IpAddrString", Type, 0, ""},
 13176  		{"IpAddrString.Context", Field, 0, ""},
 13177  		{"IpAddrString.IpAddress", Field, 0, ""},
 13178  		{"IpAddrString.IpMask", Field, 0, ""},
 13179  		{"IpAddrString.Next", Field, 0, ""},
 13180  		{"IpAddressString", Type, 0, ""},
 13181  		{"IpAddressString.String", Field, 0, ""},
 13182  		{"IpMaskString", Type, 0, ""},
 13183  		{"IpMaskString.String", Field, 2, ""},
 13184  		{"Issetugid", Func, 0, ""},
 13185  		{"KEY_ALL_ACCESS", Const, 0, ""},
 13186  		{"KEY_CREATE_LINK", Const, 0, ""},
 13187  		{"KEY_CREATE_SUB_KEY", Const, 0, ""},
 13188  		{"KEY_ENUMERATE_SUB_KEYS", Const, 0, ""},
 13189  		{"KEY_EXECUTE", Const, 0, ""},
 13190  		{"KEY_NOTIFY", Const, 0, ""},
 13191  		{"KEY_QUERY_VALUE", Const, 0, ""},
 13192  		{"KEY_READ", Const, 0, ""},
 13193  		{"KEY_SET_VALUE", Const, 0, ""},
 13194  		{"KEY_WOW64_32KEY", Const, 0, ""},
 13195  		{"KEY_WOW64_64KEY", Const, 0, ""},
 13196  		{"KEY_WRITE", Const, 0, ""},
 13197  		{"Kevent", Func, 0, ""},
 13198  		{"Kevent_t", Type, 0, ""},
 13199  		{"Kevent_t.Data", Field, 0, ""},
 13200  		{"Kevent_t.Fflags", Field, 0, ""},
 13201  		{"Kevent_t.Filter", Field, 0, ""},
 13202  		{"Kevent_t.Flags", Field, 0, ""},
 13203  		{"Kevent_t.Ident", Field, 0, ""},
 13204  		{"Kevent_t.Pad_cgo_0", Field, 2, ""},
 13205  		{"Kevent_t.Udata", Field, 0, ""},
 13206  		{"Kill", Func, 0, "func(pid int, sig Signal) (err error)"},
 13207  		{"Klogctl", Func, 0, "func(typ int, buf []byte) (n int, err error)"},
 13208  		{"Kqueue", Func, 0, ""},
 13209  		{"LANG_ENGLISH", Const, 0, ""},
 13210  		{"LAYERED_PROTOCOL", Const, 2, ""},
 13211  		{"LCNT_OVERLOAD_FLUSH", Const, 1, ""},
 13212  		{"LINUX_REBOOT_CMD_CAD_OFF", Const, 0, ""},
 13213  		{"LINUX_REBOOT_CMD_CAD_ON", Const, 0, ""},
 13214  		{"LINUX_REBOOT_CMD_HALT", Const, 0, ""},
 13215  		{"LINUX_REBOOT_CMD_KEXEC", Const, 0, ""},
 13216  		{"LINUX_REBOOT_CMD_POWER_OFF", Const, 0, ""},
 13217  		{"LINUX_REBOOT_CMD_RESTART", Const, 0, ""},
 13218  		{"LINUX_REBOOT_CMD_RESTART2", Const, 0, ""},
 13219  		{"LINUX_REBOOT_CMD_SW_SUSPEND", Const, 0, ""},
 13220  		{"LINUX_REBOOT_MAGIC1", Const, 0, ""},
 13221  		{"LINUX_REBOOT_MAGIC2", Const, 0, ""},
 13222  		{"LOCK_EX", Const, 0, ""},
 13223  		{"LOCK_NB", Const, 0, ""},
 13224  		{"LOCK_SH", Const, 0, ""},
 13225  		{"LOCK_UN", Const, 0, ""},
 13226  		{"LazyDLL", Type, 0, ""},
 13227  		{"LazyDLL.Name", Field, 0, ""},
 13228  		{"LazyProc", Type, 0, ""},
 13229  		{"LazyProc.Name", Field, 0, ""},
 13230  		{"Lchown", Func, 0, "func(path string, uid int, gid int) (err error)"},
 13231  		{"Linger", Type, 0, ""},
 13232  		{"Linger.Linger", Field, 0, ""},
 13233  		{"Linger.Onoff", Field, 0, ""},
 13234  		{"Link", Func, 0, "func(oldpath string, newpath string) (err error)"},
 13235  		{"Listen", Func, 0, "func(s int, n int) (err error)"},
 13236  		{"Listxattr", Func, 1, "func(path string, dest []byte) (sz int, err error)"},
 13237  		{"LoadCancelIoEx", Func, 1, ""},
 13238  		{"LoadConnectEx", Func, 1, ""},
 13239  		{"LoadCreateSymbolicLink", Func, 4, ""},
 13240  		{"LoadDLL", Func, 0, ""},
 13241  		{"LoadGetAddrInfo", Func, 1, ""},
 13242  		{"LoadLibrary", Func, 0, ""},
 13243  		{"LoadSetFileCompletionNotificationModes", Func, 2, ""},
 13244  		{"LocalFree", Func, 0, ""},
 13245  		{"Log2phys_t", Type, 0, ""},
 13246  		{"Log2phys_t.Contigbytes", Field, 0, ""},
 13247  		{"Log2phys_t.Devoffset", Field, 0, ""},
 13248  		{"Log2phys_t.Flags", Field, 0, ""},
 13249  		{"LookupAccountName", Func, 0, ""},
 13250  		{"LookupAccountSid", Func, 0, ""},
 13251  		{"LookupSID", Func, 0, ""},
 13252  		{"LsfJump", Func, 0, "func(code int, k int, jt int, jf int) *SockFilter"},
 13253  		{"LsfSocket", Func, 0, "func(ifindex int, proto int) (int, error)"},
 13254  		{"LsfStmt", Func, 0, "func(code int, k int) *SockFilter"},
 13255  		{"Lstat", Func, 0, "func(path string, stat *Stat_t) (err error)"},
 13256  		{"MADV_AUTOSYNC", Const, 1, ""},
 13257  		{"MADV_CAN_REUSE", Const, 0, ""},
 13258  		{"MADV_CORE", Const, 1, ""},
 13259  		{"MADV_DOFORK", Const, 0, ""},
 13260  		{"MADV_DONTFORK", Const, 0, ""},
 13261  		{"MADV_DONTNEED", Const, 0, ""},
 13262  		{"MADV_FREE", Const, 0, ""},
 13263  		{"MADV_FREE_REUSABLE", Const, 0, ""},
 13264  		{"MADV_FREE_REUSE", Const, 0, ""},
 13265  		{"MADV_HUGEPAGE", Const, 0, ""},
 13266  		{"MADV_HWPOISON", Const, 0, ""},
 13267  		{"MADV_MERGEABLE", Const, 0, ""},
 13268  		{"MADV_NOCORE", Const, 1, ""},
 13269  		{"MADV_NOHUGEPAGE", Const, 0, ""},
 13270  		{"MADV_NORMAL", Const, 0, ""},
 13271  		{"MADV_NOSYNC", Const, 1, ""},
 13272  		{"MADV_PROTECT", Const, 1, ""},
 13273  		{"MADV_RANDOM", Const, 0, ""},
 13274  		{"MADV_REMOVE", Const, 0, ""},
 13275  		{"MADV_SEQUENTIAL", Const, 0, ""},
 13276  		{"MADV_SPACEAVAIL", Const, 3, ""},
 13277  		{"MADV_UNMERGEABLE", Const, 0, ""},
 13278  		{"MADV_WILLNEED", Const, 0, ""},
 13279  		{"MADV_ZERO_WIRED_PAGES", Const, 0, ""},
 13280  		{"MAP_32BIT", Const, 0, ""},
 13281  		{"MAP_ALIGNED_SUPER", Const, 3, ""},
 13282  		{"MAP_ALIGNMENT_16MB", Const, 3, ""},
 13283  		{"MAP_ALIGNMENT_1TB", Const, 3, ""},
 13284  		{"MAP_ALIGNMENT_256TB", Const, 3, ""},
 13285  		{"MAP_ALIGNMENT_4GB", Const, 3, ""},
 13286  		{"MAP_ALIGNMENT_64KB", Const, 3, ""},
 13287  		{"MAP_ALIGNMENT_64PB", Const, 3, ""},
 13288  		{"MAP_ALIGNMENT_MASK", Const, 3, ""},
 13289  		{"MAP_ALIGNMENT_SHIFT", Const, 3, ""},
 13290  		{"MAP_ANON", Const, 0, ""},
 13291  		{"MAP_ANONYMOUS", Const, 0, ""},
 13292  		{"MAP_COPY", Const, 0, ""},
 13293  		{"MAP_DENYWRITE", Const, 0, ""},
 13294  		{"MAP_EXECUTABLE", Const, 0, ""},
 13295  		{"MAP_FILE", Const, 0, ""},
 13296  		{"MAP_FIXED", Const, 0, ""},
 13297  		{"MAP_FLAGMASK", Const, 3, ""},
 13298  		{"MAP_GROWSDOWN", Const, 0, ""},
 13299  		{"MAP_HASSEMAPHORE", Const, 0, ""},
 13300  		{"MAP_HUGETLB", Const, 0, ""},
 13301  		{"MAP_INHERIT", Const, 3, ""},
 13302  		{"MAP_INHERIT_COPY", Const, 3, ""},
 13303  		{"MAP_INHERIT_DEFAULT", Const, 3, ""},
 13304  		{"MAP_INHERIT_DONATE_COPY", Const, 3, ""},
 13305  		{"MAP_INHERIT_NONE", Const, 3, ""},
 13306  		{"MAP_INHERIT_SHARE", Const, 3, ""},
 13307  		{"MAP_JIT", Const, 0, ""},
 13308  		{"MAP_LOCKED", Const, 0, ""},
 13309  		{"MAP_NOCACHE", Const, 0, ""},
 13310  		{"MAP_NOCORE", Const, 1, ""},
 13311  		{"MAP_NOEXTEND", Const, 0, ""},
 13312  		{"MAP_NONBLOCK", Const, 0, ""},
 13313  		{"MAP_NORESERVE", Const, 0, ""},
 13314  		{"MAP_NOSYNC", Const, 1, ""},
 13315  		{"MAP_POPULATE", Const, 0, ""},
 13316  		{"MAP_PREFAULT_READ", Const, 1, ""},
 13317  		{"MAP_PRIVATE", Const, 0, ""},
 13318  		{"MAP_RENAME", Const, 0, ""},
 13319  		{"MAP_RESERVED0080", Const, 0, ""},
 13320  		{"MAP_RESERVED0100", Const, 1, ""},
 13321  		{"MAP_SHARED", Const, 0, ""},
 13322  		{"MAP_STACK", Const, 0, ""},
 13323  		{"MAP_TRYFIXED", Const, 3, ""},
 13324  		{"MAP_TYPE", Const, 0, ""},
 13325  		{"MAP_WIRED", Const, 3, ""},
 13326  		{"MAXIMUM_REPARSE_DATA_BUFFER_SIZE", Const, 4, ""},
 13327  		{"MAXLEN_IFDESCR", Const, 0, ""},
 13328  		{"MAXLEN_PHYSADDR", Const, 0, ""},
 13329  		{"MAX_ADAPTER_ADDRESS_LENGTH", Const, 0, ""},
 13330  		{"MAX_ADAPTER_DESCRIPTION_LENGTH", Const, 0, ""},
 13331  		{"MAX_ADAPTER_NAME_LENGTH", Const, 0, ""},
 13332  		{"MAX_COMPUTERNAME_LENGTH", Const, 0, ""},
 13333  		{"MAX_INTERFACE_NAME_LEN", Const, 0, ""},
 13334  		{"MAX_LONG_PATH", Const, 0, ""},
 13335  		{"MAX_PATH", Const, 0, ""},
 13336  		{"MAX_PROTOCOL_CHAIN", Const, 2, ""},
 13337  		{"MCL_CURRENT", Const, 0, ""},
 13338  		{"MCL_FUTURE", Const, 0, ""},
 13339  		{"MNT_DETACH", Const, 0, ""},
 13340  		{"MNT_EXPIRE", Const, 0, ""},
 13341  		{"MNT_FORCE", Const, 0, ""},
 13342  		{"MSG_BCAST", Const, 1, ""},
 13343  		{"MSG_CMSG_CLOEXEC", Const, 0, ""},
 13344  		{"MSG_COMPAT", Const, 0, ""},
 13345  		{"MSG_CONFIRM", Const, 0, ""},
 13346  		{"MSG_CONTROLMBUF", Const, 1, ""},
 13347  		{"MSG_CTRUNC", Const, 0, ""},
 13348  		{"MSG_DONTROUTE", Const, 0, ""},
 13349  		{"MSG_DONTWAIT", Const, 0, ""},
 13350  		{"MSG_EOF", Const, 0, ""},
 13351  		{"MSG_EOR", Const, 0, ""},
 13352  		{"MSG_ERRQUEUE", Const, 0, ""},
 13353  		{"MSG_FASTOPEN", Const, 1, ""},
 13354  		{"MSG_FIN", Const, 0, ""},
 13355  		{"MSG_FLUSH", Const, 0, ""},
 13356  		{"MSG_HAVEMORE", Const, 0, ""},
 13357  		{"MSG_HOLD", Const, 0, ""},
 13358  		{"MSG_IOVUSRSPACE", Const, 1, ""},
 13359  		{"MSG_LENUSRSPACE", Const, 1, ""},
 13360  		{"MSG_MCAST", Const, 1, ""},
 13361  		{"MSG_MORE", Const, 0, ""},
 13362  		{"MSG_NAMEMBUF", Const, 1, ""},
 13363  		{"MSG_NBIO", Const, 0, ""},
 13364  		{"MSG_NEEDSA", Const, 0, ""},
 13365  		{"MSG_NOSIGNAL", Const, 0, ""},
 13366  		{"MSG_NOTIFICATION", Const, 0, ""},
 13367  		{"MSG_OOB", Const, 0, ""},
 13368  		{"MSG_PEEK", Const, 0, ""},
 13369  		{"MSG_PROXY", Const, 0, ""},
 13370  		{"MSG_RCVMORE", Const, 0, ""},
 13371  		{"MSG_RST", Const, 0, ""},
 13372  		{"MSG_SEND", Const, 0, ""},
 13373  		{"MSG_SYN", Const, 0, ""},
 13374  		{"MSG_TRUNC", Const, 0, ""},
 13375  		{"MSG_TRYHARD", Const, 0, ""},
 13376  		{"MSG_USERFLAGS", Const, 1, ""},
 13377  		{"MSG_WAITALL", Const, 0, ""},
 13378  		{"MSG_WAITFORONE", Const, 0, ""},
 13379  		{"MSG_WAITSTREAM", Const, 0, ""},
 13380  		{"MS_ACTIVE", Const, 0, ""},
 13381  		{"MS_ASYNC", Const, 0, ""},
 13382  		{"MS_BIND", Const, 0, ""},
 13383  		{"MS_DEACTIVATE", Const, 0, ""},
 13384  		{"MS_DIRSYNC", Const, 0, ""},
 13385  		{"MS_INVALIDATE", Const, 0, ""},
 13386  		{"MS_I_VERSION", Const, 0, ""},
 13387  		{"MS_KERNMOUNT", Const, 0, ""},
 13388  		{"MS_KILLPAGES", Const, 0, ""},
 13389  		{"MS_MANDLOCK", Const, 0, ""},
 13390  		{"MS_MGC_MSK", Const, 0, ""},
 13391  		{"MS_MGC_VAL", Const, 0, ""},
 13392  		{"MS_MOVE", Const, 0, ""},
 13393  		{"MS_NOATIME", Const, 0, ""},
 13394  		{"MS_NODEV", Const, 0, ""},
 13395  		{"MS_NODIRATIME", Const, 0, ""},
 13396  		{"MS_NOEXEC", Const, 0, ""},
 13397  		{"MS_NOSUID", Const, 0, ""},
 13398  		{"MS_NOUSER", Const, 0, ""},
 13399  		{"MS_POSIXACL", Const, 0, ""},
 13400  		{"MS_PRIVATE", Const, 0, ""},
 13401  		{"MS_RDONLY", Const, 0, ""},
 13402  		{"MS_REC", Const, 0, ""},
 13403  		{"MS_RELATIME", Const, 0, ""},
 13404  		{"MS_REMOUNT", Const, 0, ""},
 13405  		{"MS_RMT_MASK", Const, 0, ""},
 13406  		{"MS_SHARED", Const, 0, ""},
 13407  		{"MS_SILENT", Const, 0, ""},
 13408  		{"MS_SLAVE", Const, 0, ""},
 13409  		{"MS_STRICTATIME", Const, 0, ""},
 13410  		{"MS_SYNC", Const, 0, ""},
 13411  		{"MS_SYNCHRONOUS", Const, 0, ""},
 13412  		{"MS_UNBINDABLE", Const, 0, ""},
 13413  		{"Madvise", Func, 0, "func(b []byte, advice int) (err error)"},
 13414  		{"MapViewOfFile", Func, 0, ""},
 13415  		{"MaxTokenInfoClass", Const, 0, ""},
 13416  		{"Mclpool", Type, 2, ""},
 13417  		{"Mclpool.Alive", Field, 2, ""},
 13418  		{"Mclpool.Cwm", Field, 2, ""},
 13419  		{"Mclpool.Grown", Field, 2, ""},
 13420  		{"Mclpool.Hwm", Field, 2, ""},
 13421  		{"Mclpool.Lwm", Field, 2, ""},
 13422  		{"MibIfRow", Type, 0, ""},
 13423  		{"MibIfRow.AdminStatus", Field, 0, ""},
 13424  		{"MibIfRow.Descr", Field, 0, ""},
 13425  		{"MibIfRow.DescrLen", Field, 0, ""},
 13426  		{"MibIfRow.InDiscards", Field, 0, ""},
 13427  		{"MibIfRow.InErrors", Field, 0, ""},
 13428  		{"MibIfRow.InNUcastPkts", Field, 0, ""},
 13429  		{"MibIfRow.InOctets", Field, 0, ""},
 13430  		{"MibIfRow.InUcastPkts", Field, 0, ""},
 13431  		{"MibIfRow.InUnknownProtos", Field, 0, ""},
 13432  		{"MibIfRow.Index", Field, 0, ""},
 13433  		{"MibIfRow.LastChange", Field, 0, ""},
 13434  		{"MibIfRow.Mtu", Field, 0, ""},
 13435  		{"MibIfRow.Name", Field, 0, ""},
 13436  		{"MibIfRow.OperStatus", Field, 0, ""},
 13437  		{"MibIfRow.OutDiscards", Field, 0, ""},
 13438  		{"MibIfRow.OutErrors", Field, 0, ""},
 13439  		{"MibIfRow.OutNUcastPkts", Field, 0, ""},
 13440  		{"MibIfRow.OutOctets", Field, 0, ""},
 13441  		{"MibIfRow.OutQLen", Field, 0, ""},
 13442  		{"MibIfRow.OutUcastPkts", Field, 0, ""},
 13443  		{"MibIfRow.PhysAddr", Field, 0, ""},
 13444  		{"MibIfRow.PhysAddrLen", Field, 0, ""},
 13445  		{"MibIfRow.Speed", Field, 0, ""},
 13446  		{"MibIfRow.Type", Field, 0, ""},
 13447  		{"Mkdir", Func, 0, "func(path string, mode uint32) (err error)"},
 13448  		{"Mkdirat", Func, 0, "func(dirfd int, path string, mode uint32) (err error)"},
 13449  		{"Mkfifo", Func, 0, "func(path string, mode uint32) (err error)"},
 13450  		{"Mknod", Func, 0, "func(path string, mode uint32, dev int) (err error)"},
 13451  		{"Mknodat", Func, 0, "func(dirfd int, path string, mode uint32, dev int) (err error)"},
 13452  		{"Mlock", Func, 0, "func(b []byte) (err error)"},
 13453  		{"Mlockall", Func, 0, "func(flags int) (err error)"},
 13454  		{"Mmap", Func, 0, "func(fd int, offset int64, length int, prot int, flags int) (data []byte, err error)"},
 13455  		{"Mount", Func, 0, "func(source string, target string, fstype string, flags uintptr, data string) (err error)"},
 13456  		{"MoveFile", Func, 0, ""},
 13457  		{"Mprotect", Func, 0, "func(b []byte, prot int) (err error)"},
 13458  		{"Msghdr", Type, 0, ""},
 13459  		{"Msghdr.Control", Field, 0, ""},
 13460  		{"Msghdr.Controllen", Field, 0, ""},
 13461  		{"Msghdr.Flags", Field, 0, ""},
 13462  		{"Msghdr.Iov", Field, 0, ""},
 13463  		{"Msghdr.Iovlen", Field, 0, ""},
 13464  		{"Msghdr.Name", Field, 0, ""},
 13465  		{"Msghdr.Namelen", Field, 0, ""},
 13466  		{"Msghdr.Pad_cgo_0", Field, 0, ""},
 13467  		{"Msghdr.Pad_cgo_1", Field, 0, ""},
 13468  		{"Munlock", Func, 0, "func(b []byte) (err error)"},
 13469  		{"Munlockall", Func, 0, "func() (err error)"},
 13470  		{"Munmap", Func, 0, "func(b []byte) (err error)"},
 13471  		{"MustLoadDLL", Func, 0, ""},
 13472  		{"NAME_MAX", Const, 0, ""},
 13473  		{"NETLINK_ADD_MEMBERSHIP", Const, 0, ""},
 13474  		{"NETLINK_AUDIT", Const, 0, ""},
 13475  		{"NETLINK_BROADCAST_ERROR", Const, 0, ""},
 13476  		{"NETLINK_CONNECTOR", Const, 0, ""},
 13477  		{"NETLINK_DNRTMSG", Const, 0, ""},
 13478  		{"NETLINK_DROP_MEMBERSHIP", Const, 0, ""},
 13479  		{"NETLINK_ECRYPTFS", Const, 0, ""},
 13480  		{"NETLINK_FIB_LOOKUP", Const, 0, ""},
 13481  		{"NETLINK_FIREWALL", Const, 0, ""},
 13482  		{"NETLINK_GENERIC", Const, 0, ""},
 13483  		{"NETLINK_INET_DIAG", Const, 0, ""},
 13484  		{"NETLINK_IP6_FW", Const, 0, ""},
 13485  		{"NETLINK_ISCSI", Const, 0, ""},
 13486  		{"NETLINK_KOBJECT_UEVENT", Const, 0, ""},
 13487  		{"NETLINK_NETFILTER", Const, 0, ""},
 13488  		{"NETLINK_NFLOG", Const, 0, ""},
 13489  		{"NETLINK_NO_ENOBUFS", Const, 0, ""},
 13490  		{"NETLINK_PKTINFO", Const, 0, ""},
 13491  		{"NETLINK_RDMA", Const, 0, ""},
 13492  		{"NETLINK_ROUTE", Const, 0, ""},
 13493  		{"NETLINK_SCSITRANSPORT", Const, 0, ""},
 13494  		{"NETLINK_SELINUX", Const, 0, ""},
 13495  		{"NETLINK_UNUSED", Const, 0, ""},
 13496  		{"NETLINK_USERSOCK", Const, 0, ""},
 13497  		{"NETLINK_XFRM", Const, 0, ""},
 13498  		{"NET_RT_DUMP", Const, 0, ""},
 13499  		{"NET_RT_DUMP2", Const, 0, ""},
 13500  		{"NET_RT_FLAGS", Const, 0, ""},
 13501  		{"NET_RT_IFLIST", Const, 0, ""},
 13502  		{"NET_RT_IFLIST2", Const, 0, ""},
 13503  		{"NET_RT_IFLISTL", Const, 1, ""},
 13504  		{"NET_RT_IFMALIST", Const, 0, ""},
 13505  		{"NET_RT_MAXID", Const, 0, ""},
 13506  		{"NET_RT_OIFLIST", Const, 1, ""},
 13507  		{"NET_RT_OOIFLIST", Const, 1, ""},
 13508  		{"NET_RT_STAT", Const, 0, ""},
 13509  		{"NET_RT_STATS", Const, 1, ""},
 13510  		{"NET_RT_TABLE", Const, 1, ""},
 13511  		{"NET_RT_TRASH", Const, 0, ""},
 13512  		{"NLA_ALIGNTO", Const, 0, ""},
 13513  		{"NLA_F_NESTED", Const, 0, ""},
 13514  		{"NLA_F_NET_BYTEORDER", Const, 0, ""},
 13515  		{"NLA_HDRLEN", Const, 0, ""},
 13516  		{"NLMSG_ALIGNTO", Const, 0, ""},
 13517  		{"NLMSG_DONE", Const, 0, ""},
 13518  		{"NLMSG_ERROR", Const, 0, ""},
 13519  		{"NLMSG_HDRLEN", Const, 0, ""},
 13520  		{"NLMSG_MIN_TYPE", Const, 0, ""},
 13521  		{"NLMSG_NOOP", Const, 0, ""},
 13522  		{"NLMSG_OVERRUN", Const, 0, ""},
 13523  		{"NLM_F_ACK", Const, 0, ""},
 13524  		{"NLM_F_APPEND", Const, 0, ""},
 13525  		{"NLM_F_ATOMIC", Const, 0, ""},
 13526  		{"NLM_F_CREATE", Const, 0, ""},
 13527  		{"NLM_F_DUMP", Const, 0, ""},
 13528  		{"NLM_F_ECHO", Const, 0, ""},
 13529  		{"NLM_F_EXCL", Const, 0, ""},
 13530  		{"NLM_F_MATCH", Const, 0, ""},
 13531  		{"NLM_F_MULTI", Const, 0, ""},
 13532  		{"NLM_F_REPLACE", Const, 0, ""},
 13533  		{"NLM_F_REQUEST", Const, 0, ""},
 13534  		{"NLM_F_ROOT", Const, 0, ""},
 13535  		{"NOFLSH", Const, 0, ""},
 13536  		{"NOTE_ABSOLUTE", Const, 0, ""},
 13537  		{"NOTE_ATTRIB", Const, 0, ""},
 13538  		{"NOTE_BACKGROUND", Const, 16, ""},
 13539  		{"NOTE_CHILD", Const, 0, ""},
 13540  		{"NOTE_CRITICAL", Const, 16, ""},
 13541  		{"NOTE_DELETE", Const, 0, ""},
 13542  		{"NOTE_EOF", Const, 1, ""},
 13543  		{"NOTE_EXEC", Const, 0, ""},
 13544  		{"NOTE_EXIT", Const, 0, ""},
 13545  		{"NOTE_EXITSTATUS", Const, 0, ""},
 13546  		{"NOTE_EXIT_CSERROR", Const, 16, ""},
 13547  		{"NOTE_EXIT_DECRYPTFAIL", Const, 16, ""},
 13548  		{"NOTE_EXIT_DETAIL", Const, 16, ""},
 13549  		{"NOTE_EXIT_DETAIL_MASK", Const, 16, ""},
 13550  		{"NOTE_EXIT_MEMORY", Const, 16, ""},
 13551  		{"NOTE_EXIT_REPARENTED", Const, 16, ""},
 13552  		{"NOTE_EXTEND", Const, 0, ""},
 13553  		{"NOTE_FFAND", Const, 0, ""},
 13554  		{"NOTE_FFCOPY", Const, 0, ""},
 13555  		{"NOTE_FFCTRLMASK", Const, 0, ""},
 13556  		{"NOTE_FFLAGSMASK", Const, 0, ""},
 13557  		{"NOTE_FFNOP", Const, 0, ""},
 13558  		{"NOTE_FFOR", Const, 0, ""},
 13559  		{"NOTE_FORK", Const, 0, ""},
 13560  		{"NOTE_LEEWAY", Const, 16, ""},
 13561  		{"NOTE_LINK", Const, 0, ""},
 13562  		{"NOTE_LOWAT", Const, 0, ""},
 13563  		{"NOTE_NONE", Const, 0, ""},
 13564  		{"NOTE_NSECONDS", Const, 0, ""},
 13565  		{"NOTE_PCTRLMASK", Const, 0, ""},
 13566  		{"NOTE_PDATAMASK", Const, 0, ""},
 13567  		{"NOTE_REAP", Const, 0, ""},
 13568  		{"NOTE_RENAME", Const, 0, ""},
 13569  		{"NOTE_RESOURCEEND", Const, 0, ""},
 13570  		{"NOTE_REVOKE", Const, 0, ""},
 13571  		{"NOTE_SECONDS", Const, 0, ""},
 13572  		{"NOTE_SIGNAL", Const, 0, ""},
 13573  		{"NOTE_TRACK", Const, 0, ""},
 13574  		{"NOTE_TRACKERR", Const, 0, ""},
 13575  		{"NOTE_TRIGGER", Const, 0, ""},
 13576  		{"NOTE_TRUNCATE", Const, 1, ""},
 13577  		{"NOTE_USECONDS", Const, 0, ""},
 13578  		{"NOTE_VM_ERROR", Const, 0, ""},
 13579  		{"NOTE_VM_PRESSURE", Const, 0, ""},
 13580  		{"NOTE_VM_PRESSURE_SUDDEN_TERMINATE", Const, 0, ""},
 13581  		{"NOTE_VM_PRESSURE_TERMINATE", Const, 0, ""},
 13582  		{"NOTE_WRITE", Const, 0, ""},
 13583  		{"NameCanonical", Const, 0, ""},
 13584  		{"NameCanonicalEx", Const, 0, ""},
 13585  		{"NameDisplay", Const, 0, ""},
 13586  		{"NameDnsDomain", Const, 0, ""},
 13587  		{"NameFullyQualifiedDN", Const, 0, ""},
 13588  		{"NameSamCompatible", Const, 0, ""},
 13589  		{"NameServicePrincipal", Const, 0, ""},
 13590  		{"NameUniqueId", Const, 0, ""},
 13591  		{"NameUnknown", Const, 0, ""},
 13592  		{"NameUserPrincipal", Const, 0, ""},
 13593  		{"Nanosleep", Func, 0, "func(time *Timespec, leftover *Timespec) (err error)"},
 13594  		{"NetApiBufferFree", Func, 0, ""},
 13595  		{"NetGetJoinInformation", Func, 2, ""},
 13596  		{"NetSetupDomainName", Const, 2, ""},
 13597  		{"NetSetupUnjoined", Const, 2, ""},
 13598  		{"NetSetupUnknownStatus", Const, 2, ""},
 13599  		{"NetSetupWorkgroupName", Const, 2, ""},
 13600  		{"NetUserGetInfo", Func, 0, ""},
 13601  		{"NetlinkMessage", Type, 0, ""},
 13602  		{"NetlinkMessage.Data", Field, 0, ""},
 13603  		{"NetlinkMessage.Header", Field, 0, ""},
 13604  		{"NetlinkRIB", Func, 0, "func(proto int, family int) ([]byte, error)"},
 13605  		{"NetlinkRouteAttr", Type, 0, ""},
 13606  		{"NetlinkRouteAttr.Attr", Field, 0, ""},
 13607  		{"NetlinkRouteAttr.Value", Field, 0, ""},
 13608  		{"NetlinkRouteRequest", Type, 0, ""},
 13609  		{"NetlinkRouteRequest.Data", Field, 0, ""},
 13610  		{"NetlinkRouteRequest.Header", Field, 0, ""},
 13611  		{"NewCallback", Func, 0, ""},
 13612  		{"NewCallbackCDecl", Func, 3, ""},
 13613  		{"NewLazyDLL", Func, 0, ""},
 13614  		{"NlAttr", Type, 0, ""},
 13615  		{"NlAttr.Len", Field, 0, ""},
 13616  		{"NlAttr.Type", Field, 0, ""},
 13617  		{"NlMsgerr", Type, 0, ""},
 13618  		{"NlMsgerr.Error", Field, 0, ""},
 13619  		{"NlMsgerr.Msg", Field, 0, ""},
 13620  		{"NlMsghdr", Type, 0, ""},
 13621  		{"NlMsghdr.Flags", Field, 0, ""},
 13622  		{"NlMsghdr.Len", Field, 0, ""},
 13623  		{"NlMsghdr.Pid", Field, 0, ""},
 13624  		{"NlMsghdr.Seq", Field, 0, ""},
 13625  		{"NlMsghdr.Type", Field, 0, ""},
 13626  		{"NsecToFiletime", Func, 0, ""},
 13627  		{"NsecToTimespec", Func, 0, "func(nsec int64) Timespec"},
 13628  		{"NsecToTimeval", Func, 0, "func(nsec int64) Timeval"},
 13629  		{"Ntohs", Func, 0, ""},
 13630  		{"OCRNL", Const, 0, ""},
 13631  		{"OFDEL", Const, 0, ""},
 13632  		{"OFILL", Const, 0, ""},
 13633  		{"OFIOGETBMAP", Const, 1, ""},
 13634  		{"OID_PKIX_KP_SERVER_AUTH", Var, 0, ""},
 13635  		{"OID_SERVER_GATED_CRYPTO", Var, 0, ""},
 13636  		{"OID_SGC_NETSCAPE", Var, 0, ""},
 13637  		{"OLCUC", Const, 0, ""},
 13638  		{"ONLCR", Const, 0, ""},
 13639  		{"ONLRET", Const, 0, ""},
 13640  		{"ONOCR", Const, 0, ""},
 13641  		{"ONOEOT", Const, 1, ""},
 13642  		{"OPEN_ALWAYS", Const, 0, ""},
 13643  		{"OPEN_EXISTING", Const, 0, ""},
 13644  		{"OPOST", Const, 0, ""},
 13645  		{"O_ACCMODE", Const, 0, ""},
 13646  		{"O_ALERT", Const, 0, ""},
 13647  		{"O_ALT_IO", Const, 1, ""},
 13648  		{"O_APPEND", Const, 0, ""},
 13649  		{"O_ASYNC", Const, 0, ""},
 13650  		{"O_CLOEXEC", Const, 0, ""},
 13651  		{"O_CREAT", Const, 0, ""},
 13652  		{"O_DIRECT", Const, 0, ""},
 13653  		{"O_DIRECTORY", Const, 0, ""},
 13654  		{"O_DP_GETRAWENCRYPTED", Const, 16, ""},
 13655  		{"O_DSYNC", Const, 0, ""},
 13656  		{"O_EVTONLY", Const, 0, ""},
 13657  		{"O_EXCL", Const, 0, ""},
 13658  		{"O_EXEC", Const, 0, ""},
 13659  		{"O_EXLOCK", Const, 0, ""},
 13660  		{"O_FSYNC", Const, 0, ""},
 13661  		{"O_LARGEFILE", Const, 0, ""},
 13662  		{"O_NDELAY", Const, 0, ""},
 13663  		{"O_NOATIME", Const, 0, ""},
 13664  		{"O_NOCTTY", Const, 0, ""},
 13665  		{"O_NOFOLLOW", Const, 0, ""},
 13666  		{"O_NONBLOCK", Const, 0, ""},
 13667  		{"O_NOSIGPIPE", Const, 1, ""},
 13668  		{"O_POPUP", Const, 0, ""},
 13669  		{"O_RDONLY", Const, 0, ""},
 13670  		{"O_RDWR", Const, 0, ""},
 13671  		{"O_RSYNC", Const, 0, ""},
 13672  		{"O_SHLOCK", Const, 0, ""},
 13673  		{"O_SYMLINK", Const, 0, ""},
 13674  		{"O_SYNC", Const, 0, ""},
 13675  		{"O_TRUNC", Const, 0, ""},
 13676  		{"O_TTY_INIT", Const, 0, ""},
 13677  		{"O_WRONLY", Const, 0, ""},
 13678  		{"Open", Func, 0, "func(path string, mode int, perm uint32) (fd int, err error)"},
 13679  		{"OpenCurrentProcessToken", Func, 0, ""},
 13680  		{"OpenProcess", Func, 0, ""},
 13681  		{"OpenProcessToken", Func, 0, ""},
 13682  		{"Openat", Func, 0, "func(dirfd int, path string, flags int, mode uint32) (fd int, err error)"},
 13683  		{"Overlapped", Type, 0, ""},
 13684  		{"Overlapped.HEvent", Field, 0, ""},
 13685  		{"Overlapped.Internal", Field, 0, ""},
 13686  		{"Overlapped.InternalHigh", Field, 0, ""},
 13687  		{"Overlapped.Offset", Field, 0, ""},
 13688  		{"Overlapped.OffsetHigh", Field, 0, ""},
 13689  		{"PACKET_ADD_MEMBERSHIP", Const, 0, ""},
 13690  		{"PACKET_BROADCAST", Const, 0, ""},
 13691  		{"PACKET_DROP_MEMBERSHIP", Const, 0, ""},
 13692  		{"PACKET_FASTROUTE", Const, 0, ""},
 13693  		{"PACKET_HOST", Const, 0, ""},
 13694  		{"PACKET_LOOPBACK", Const, 0, ""},
 13695  		{"PACKET_MR_ALLMULTI", Const, 0, ""},
 13696  		{"PACKET_MR_MULTICAST", Const, 0, ""},
 13697  		{"PACKET_MR_PROMISC", Const, 0, ""},
 13698  		{"PACKET_MULTICAST", Const, 0, ""},
 13699  		{"PACKET_OTHERHOST", Const, 0, ""},
 13700  		{"PACKET_OUTGOING", Const, 0, ""},
 13701  		{"PACKET_RECV_OUTPUT", Const, 0, ""},
 13702  		{"PACKET_RX_RING", Const, 0, ""},
 13703  		{"PACKET_STATISTICS", Const, 0, ""},
 13704  		{"PAGE_EXECUTE_READ", Const, 0, ""},
 13705  		{"PAGE_EXECUTE_READWRITE", Const, 0, ""},
 13706  		{"PAGE_EXECUTE_WRITECOPY", Const, 0, ""},
 13707  		{"PAGE_READONLY", Const, 0, ""},
 13708  		{"PAGE_READWRITE", Const, 0, ""},
 13709  		{"PAGE_WRITECOPY", Const, 0, ""},
 13710  		{"PARENB", Const, 0, ""},
 13711  		{"PARMRK", Const, 0, ""},
 13712  		{"PARODD", Const, 0, ""},
 13713  		{"PENDIN", Const, 0, ""},
 13714  		{"PFL_HIDDEN", Const, 2, ""},
 13715  		{"PFL_MATCHES_PROTOCOL_ZERO", Const, 2, ""},
 13716  		{"PFL_MULTIPLE_PROTO_ENTRIES", Const, 2, ""},
 13717  		{"PFL_NETWORKDIRECT_PROVIDER", Const, 2, ""},
 13718  		{"PFL_RECOMMENDED_PROTO_ENTRY", Const, 2, ""},
 13719  		{"PF_FLUSH", Const, 1, ""},
 13720  		{"PKCS_7_ASN_ENCODING", Const, 0, ""},
 13721  		{"PMC5_PIPELINE_FLUSH", Const, 1, ""},
 13722  		{"PRIO_PGRP", Const, 2, ""},
 13723  		{"PRIO_PROCESS", Const, 2, ""},
 13724  		{"PRIO_USER", Const, 2, ""},
 13725  		{"PRI_IOFLUSH", Const, 1, ""},
 13726  		{"PROCESS_QUERY_INFORMATION", Const, 0, ""},
 13727  		{"PROCESS_TERMINATE", Const, 2, ""},
 13728  		{"PROT_EXEC", Const, 0, ""},
 13729  		{"PROT_GROWSDOWN", Const, 0, ""},
 13730  		{"PROT_GROWSUP", Const, 0, ""},
 13731  		{"PROT_NONE", Const, 0, ""},
 13732  		{"PROT_READ", Const, 0, ""},
 13733  		{"PROT_WRITE", Const, 0, ""},
 13734  		{"PROV_DH_SCHANNEL", Const, 0, ""},
 13735  		{"PROV_DSS", Const, 0, ""},
 13736  		{"PROV_DSS_DH", Const, 0, ""},
 13737  		{"PROV_EC_ECDSA_FULL", Const, 0, ""},
 13738  		{"PROV_EC_ECDSA_SIG", Const, 0, ""},
 13739  		{"PROV_EC_ECNRA_FULL", Const, 0, ""},
 13740  		{"PROV_EC_ECNRA_SIG", Const, 0, ""},
 13741  		{"PROV_FORTEZZA", Const, 0, ""},
 13742  		{"PROV_INTEL_SEC", Const, 0, ""},
 13743  		{"PROV_MS_EXCHANGE", Const, 0, ""},
 13744  		{"PROV_REPLACE_OWF", Const, 0, ""},
 13745  		{"PROV_RNG", Const, 0, ""},
 13746  		{"PROV_RSA_AES", Const, 0, ""},
 13747  		{"PROV_RSA_FULL", Const, 0, ""},
 13748  		{"PROV_RSA_SCHANNEL", Const, 0, ""},
 13749  		{"PROV_RSA_SIG", Const, 0, ""},
 13750  		{"PROV_SPYRUS_LYNKS", Const, 0, ""},
 13751  		{"PROV_SSL", Const, 0, ""},
 13752  		{"PR_CAPBSET_DROP", Const, 0, ""},
 13753  		{"PR_CAPBSET_READ", Const, 0, ""},
 13754  		{"PR_CLEAR_SECCOMP_FILTER", Const, 0, ""},
 13755  		{"PR_ENDIAN_BIG", Const, 0, ""},
 13756  		{"PR_ENDIAN_LITTLE", Const, 0, ""},
 13757  		{"PR_ENDIAN_PPC_LITTLE", Const, 0, ""},
 13758  		{"PR_FPEMU_NOPRINT", Const, 0, ""},
 13759  		{"PR_FPEMU_SIGFPE", Const, 0, ""},
 13760  		{"PR_FP_EXC_ASYNC", Const, 0, ""},
 13761  		{"PR_FP_EXC_DISABLED", Const, 0, ""},
 13762  		{"PR_FP_EXC_DIV", Const, 0, ""},
 13763  		{"PR_FP_EXC_INV", Const, 0, ""},
 13764  		{"PR_FP_EXC_NONRECOV", Const, 0, ""},
 13765  		{"PR_FP_EXC_OVF", Const, 0, ""},
 13766  		{"PR_FP_EXC_PRECISE", Const, 0, ""},
 13767  		{"PR_FP_EXC_RES", Const, 0, ""},
 13768  		{"PR_FP_EXC_SW_ENABLE", Const, 0, ""},
 13769  		{"PR_FP_EXC_UND", Const, 0, ""},
 13770  		{"PR_GET_DUMPABLE", Const, 0, ""},
 13771  		{"PR_GET_ENDIAN", Const, 0, ""},
 13772  		{"PR_GET_FPEMU", Const, 0, ""},
 13773  		{"PR_GET_FPEXC", Const, 0, ""},
 13774  		{"PR_GET_KEEPCAPS", Const, 0, ""},
 13775  		{"PR_GET_NAME", Const, 0, ""},
 13776  		{"PR_GET_PDEATHSIG", Const, 0, ""},
 13777  		{"PR_GET_SECCOMP", Const, 0, ""},
 13778  		{"PR_GET_SECCOMP_FILTER", Const, 0, ""},
 13779  		{"PR_GET_SECUREBITS", Const, 0, ""},
 13780  		{"PR_GET_TIMERSLACK", Const, 0, ""},
 13781  		{"PR_GET_TIMING", Const, 0, ""},
 13782  		{"PR_GET_TSC", Const, 0, ""},
 13783  		{"PR_GET_UNALIGN", Const, 0, ""},
 13784  		{"PR_MCE_KILL", Const, 0, ""},
 13785  		{"PR_MCE_KILL_CLEAR", Const, 0, ""},
 13786  		{"PR_MCE_KILL_DEFAULT", Const, 0, ""},
 13787  		{"PR_MCE_KILL_EARLY", Const, 0, ""},
 13788  		{"PR_MCE_KILL_GET", Const, 0, ""},
 13789  		{"PR_MCE_KILL_LATE", Const, 0, ""},
 13790  		{"PR_MCE_KILL_SET", Const, 0, ""},
 13791  		{"PR_SECCOMP_FILTER_EVENT", Const, 0, ""},
 13792  		{"PR_SECCOMP_FILTER_SYSCALL", Const, 0, ""},
 13793  		{"PR_SET_DUMPABLE", Const, 0, ""},
 13794  		{"PR_SET_ENDIAN", Const, 0, ""},
 13795  		{"PR_SET_FPEMU", Const, 0, ""},
 13796  		{"PR_SET_FPEXC", Const, 0, ""},
 13797  		{"PR_SET_KEEPCAPS", Const, 0, ""},
 13798  		{"PR_SET_NAME", Const, 0, ""},
 13799  		{"PR_SET_PDEATHSIG", Const, 0, ""},
 13800  		{"PR_SET_PTRACER", Const, 0, ""},
 13801  		{"PR_SET_SECCOMP", Const, 0, ""},
 13802  		{"PR_SET_SECCOMP_FILTER", Const, 0, ""},
 13803  		{"PR_SET_SECUREBITS", Const, 0, ""},
 13804  		{"PR_SET_TIMERSLACK", Const, 0, ""},
 13805  		{"PR_SET_TIMING", Const, 0, ""},
 13806  		{"PR_SET_TSC", Const, 0, ""},
 13807  		{"PR_SET_UNALIGN", Const, 0, ""},
 13808  		{"PR_TASK_PERF_EVENTS_DISABLE", Const, 0, ""},
 13809  		{"PR_TASK_PERF_EVENTS_ENABLE", Const, 0, ""},
 13810  		{"PR_TIMING_STATISTICAL", Const, 0, ""},
 13811  		{"PR_TIMING_TIMESTAMP", Const, 0, ""},
 13812  		{"PR_TSC_ENABLE", Const, 0, ""},
 13813  		{"PR_TSC_SIGSEGV", Const, 0, ""},
 13814  		{"PR_UNALIGN_NOPRINT", Const, 0, ""},
 13815  		{"PR_UNALIGN_SIGBUS", Const, 0, ""},
 13816  		{"PTRACE_ARCH_PRCTL", Const, 0, ""},
 13817  		{"PTRACE_ATTACH", Const, 0, ""},
 13818  		{"PTRACE_CONT", Const, 0, ""},
 13819  		{"PTRACE_DETACH", Const, 0, ""},
 13820  		{"PTRACE_EVENT_CLONE", Const, 0, ""},
 13821  		{"PTRACE_EVENT_EXEC", Const, 0, ""},
 13822  		{"PTRACE_EVENT_EXIT", Const, 0, ""},
 13823  		{"PTRACE_EVENT_FORK", Const, 0, ""},
 13824  		{"PTRACE_EVENT_VFORK", Const, 0, ""},
 13825  		{"PTRACE_EVENT_VFORK_DONE", Const, 0, ""},
 13826  		{"PTRACE_GETCRUNCHREGS", Const, 0, ""},
 13827  		{"PTRACE_GETEVENTMSG", Const, 0, ""},
 13828  		{"PTRACE_GETFPREGS", Const, 0, ""},
 13829  		{"PTRACE_GETFPXREGS", Const, 0, ""},
 13830  		{"PTRACE_GETHBPREGS", Const, 0, ""},
 13831  		{"PTRACE_GETREGS", Const, 0, ""},
 13832  		{"PTRACE_GETREGSET", Const, 0, ""},
 13833  		{"PTRACE_GETSIGINFO", Const, 0, ""},
 13834  		{"PTRACE_GETVFPREGS", Const, 0, ""},
 13835  		{"PTRACE_GETWMMXREGS", Const, 0, ""},
 13836  		{"PTRACE_GET_THREAD_AREA", Const, 0, ""},
 13837  		{"PTRACE_KILL", Const, 0, ""},
 13838  		{"PTRACE_OLDSETOPTIONS", Const, 0, ""},
 13839  		{"PTRACE_O_MASK", Const, 0, ""},
 13840  		{"PTRACE_O_TRACECLONE", Const, 0, ""},
 13841  		{"PTRACE_O_TRACEEXEC", Const, 0, ""},
 13842  		{"PTRACE_O_TRACEEXIT", Const, 0, ""},
 13843  		{"PTRACE_O_TRACEFORK", Const, 0, ""},
 13844  		{"PTRACE_O_TRACESYSGOOD", Const, 0, ""},
 13845  		{"PTRACE_O_TRACEVFORK", Const, 0, ""},
 13846  		{"PTRACE_O_TRACEVFORKDONE", Const, 0, ""},
 13847  		{"PTRACE_PEEKDATA", Const, 0, ""},
 13848  		{"PTRACE_PEEKTEXT", Const, 0, ""},
 13849  		{"PTRACE_PEEKUSR", Const, 0, ""},
 13850  		{"PTRACE_POKEDATA", Const, 0, ""},
 13851  		{"PTRACE_POKETEXT", Const, 0, ""},
 13852  		{"PTRACE_POKEUSR", Const, 0, ""},
 13853  		{"PTRACE_SETCRUNCHREGS", Const, 0, ""},
 13854  		{"PTRACE_SETFPREGS", Const, 0, ""},
 13855  		{"PTRACE_SETFPXREGS", Const, 0, ""},
 13856  		{"PTRACE_SETHBPREGS", Const, 0, ""},
 13857  		{"PTRACE_SETOPTIONS", Const, 0, ""},
 13858  		{"PTRACE_SETREGS", Const, 0, ""},
 13859  		{"PTRACE_SETREGSET", Const, 0, ""},
 13860  		{"PTRACE_SETSIGINFO", Const, 0, ""},
 13861  		{"PTRACE_SETVFPREGS", Const, 0, ""},
 13862  		{"PTRACE_SETWMMXREGS", Const, 0, ""},
 13863  		{"PTRACE_SET_SYSCALL", Const, 0, ""},
 13864  		{"PTRACE_SET_THREAD_AREA", Const, 0, ""},
 13865  		{"PTRACE_SINGLEBLOCK", Const, 0, ""},
 13866  		{"PTRACE_SINGLESTEP", Const, 0, ""},
 13867  		{"PTRACE_SYSCALL", Const, 0, ""},
 13868  		{"PTRACE_SYSEMU", Const, 0, ""},
 13869  		{"PTRACE_SYSEMU_SINGLESTEP", Const, 0, ""},
 13870  		{"PTRACE_TRACEME", Const, 0, ""},
 13871  		{"PT_ATTACH", Const, 0, ""},
 13872  		{"PT_ATTACHEXC", Const, 0, ""},
 13873  		{"PT_CONTINUE", Const, 0, ""},
 13874  		{"PT_DATA_ADDR", Const, 0, ""},
 13875  		{"PT_DENY_ATTACH", Const, 0, ""},
 13876  		{"PT_DETACH", Const, 0, ""},
 13877  		{"PT_FIRSTMACH", Const, 0, ""},
 13878  		{"PT_FORCEQUOTA", Const, 0, ""},
 13879  		{"PT_KILL", Const, 0, ""},
 13880  		{"PT_MASK", Const, 1, ""},
 13881  		{"PT_READ_D", Const, 0, ""},
 13882  		{"PT_READ_I", Const, 0, ""},
 13883  		{"PT_READ_U", Const, 0, ""},
 13884  		{"PT_SIGEXC", Const, 0, ""},
 13885  		{"PT_STEP", Const, 0, ""},
 13886  		{"PT_TEXT_ADDR", Const, 0, ""},
 13887  		{"PT_TEXT_END_ADDR", Const, 0, ""},
 13888  		{"PT_THUPDATE", Const, 0, ""},
 13889  		{"PT_TRACE_ME", Const, 0, ""},
 13890  		{"PT_WRITE_D", Const, 0, ""},
 13891  		{"PT_WRITE_I", Const, 0, ""},
 13892  		{"PT_WRITE_U", Const, 0, ""},
 13893  		{"ParseDirent", Func, 0, "func(buf []byte, max int, names []string) (consumed int, count int, newnames []string)"},
 13894  		{"ParseNetlinkMessage", Func, 0, "func(b []byte) ([]NetlinkMessage, error)"},
 13895  		{"ParseNetlinkRouteAttr", Func, 0, "func(m *NetlinkMessage) ([]NetlinkRouteAttr, error)"},
 13896  		{"ParseRoutingMessage", Func, 0, ""},
 13897  		{"ParseRoutingSockaddr", Func, 0, ""},
 13898  		{"ParseSocketControlMessage", Func, 0, "func(b []byte) ([]SocketControlMessage, error)"},
 13899  		{"ParseUnixCredentials", Func, 0, "func(m *SocketControlMessage) (*Ucred, error)"},
 13900  		{"ParseUnixRights", Func, 0, "func(m *SocketControlMessage) ([]int, error)"},
 13901  		{"PathMax", Const, 0, ""},
 13902  		{"Pathconf", Func, 0, ""},
 13903  		{"Pause", Func, 0, "func() (err error)"},
 13904  		{"Pipe", Func, 0, "func(p []int) error"},
 13905  		{"Pipe2", Func, 1, "func(p []int, flags int) error"},
 13906  		{"PivotRoot", Func, 0, "func(newroot string, putold string) (err error)"},
 13907  		{"Pointer", Type, 11, ""},
 13908  		{"PostQueuedCompletionStatus", Func, 0, ""},
 13909  		{"Pread", Func, 0, "func(fd int, p []byte, offset int64) (n int, err error)"},
 13910  		{"Proc", Type, 0, ""},
 13911  		{"Proc.Dll", Field, 0, ""},
 13912  		{"Proc.Name", Field, 0, ""},
 13913  		{"ProcAttr", Type, 0, ""},
 13914  		{"ProcAttr.Dir", Field, 0, ""},
 13915  		{"ProcAttr.Env", Field, 0, ""},
 13916  		{"ProcAttr.Files", Field, 0, ""},
 13917  		{"ProcAttr.Sys", Field, 0, ""},
 13918  		{"Process32First", Func, 4, ""},
 13919  		{"Process32Next", Func, 4, ""},
 13920  		{"ProcessEntry32", Type, 4, ""},
 13921  		{"ProcessEntry32.DefaultHeapID", Field, 4, ""},
 13922  		{"ProcessEntry32.ExeFile", Field, 4, ""},
 13923  		{"ProcessEntry32.Flags", Field, 4, ""},
 13924  		{"ProcessEntry32.ModuleID", Field, 4, ""},
 13925  		{"ProcessEntry32.ParentProcessID", Field, 4, ""},
 13926  		{"ProcessEntry32.PriClassBase", Field, 4, ""},
 13927  		{"ProcessEntry32.ProcessID", Field, 4, ""},
 13928  		{"ProcessEntry32.Size", Field, 4, ""},
 13929  		{"ProcessEntry32.Threads", Field, 4, ""},
 13930  		{"ProcessEntry32.Usage", Field, 4, ""},
 13931  		{"ProcessInformation", Type, 0, ""},
 13932  		{"ProcessInformation.Process", Field, 0, ""},
 13933  		{"ProcessInformation.ProcessId", Field, 0, ""},
 13934  		{"ProcessInformation.Thread", Field, 0, ""},
 13935  		{"ProcessInformation.ThreadId", Field, 0, ""},
 13936  		{"Protoent", Type, 0, ""},
 13937  		{"Protoent.Aliases", Field, 0, ""},
 13938  		{"Protoent.Name", Field, 0, ""},
 13939  		{"Protoent.Proto", Field, 0, ""},
 13940  		{"PtraceAttach", Func, 0, "func(pid int) (err error)"},
 13941  		{"PtraceCont", Func, 0, "func(pid int, signal int) (err error)"},
 13942  		{"PtraceDetach", Func, 0, "func(pid int) (err error)"},
 13943  		{"PtraceGetEventMsg", Func, 0, "func(pid int) (msg uint, err error)"},
 13944  		{"PtraceGetRegs", Func, 0, "func(pid int, regsout *PtraceRegs) (err error)"},
 13945  		{"PtracePeekData", Func, 0, "func(pid int, addr uintptr, out []byte) (count int, err error)"},
 13946  		{"PtracePeekText", Func, 0, "func(pid int, addr uintptr, out []byte) (count int, err error)"},
 13947  		{"PtracePokeData", Func, 0, "func(pid int, addr uintptr, data []byte) (count int, err error)"},
 13948  		{"PtracePokeText", Func, 0, "func(pid int, addr uintptr, data []byte) (count int, err error)"},
 13949  		{"PtraceRegs", Type, 0, ""},
 13950  		{"PtraceRegs.Cs", Field, 0, ""},
 13951  		{"PtraceRegs.Ds", Field, 0, ""},
 13952  		{"PtraceRegs.Eax", Field, 0, ""},
 13953  		{"PtraceRegs.Ebp", Field, 0, ""},
 13954  		{"PtraceRegs.Ebx", Field, 0, ""},
 13955  		{"PtraceRegs.Ecx", Field, 0, ""},
 13956  		{"PtraceRegs.Edi", Field, 0, ""},
 13957  		{"PtraceRegs.Edx", Field, 0, ""},
 13958  		{"PtraceRegs.Eflags", Field, 0, ""},
 13959  		{"PtraceRegs.Eip", Field, 0, ""},
 13960  		{"PtraceRegs.Es", Field, 0, ""},
 13961  		{"PtraceRegs.Esi", Field, 0, ""},
 13962  		{"PtraceRegs.Esp", Field, 0, ""},
 13963  		{"PtraceRegs.Fs", Field, 0, ""},
 13964  		{"PtraceRegs.Fs_base", Field, 0, ""},
 13965  		{"PtraceRegs.Gs", Field, 0, ""},
 13966  		{"PtraceRegs.Gs_base", Field, 0, ""},
 13967  		{"PtraceRegs.Orig_eax", Field, 0, ""},
 13968  		{"PtraceRegs.Orig_rax", Field, 0, ""},
 13969  		{"PtraceRegs.R10", Field, 0, ""},
 13970  		{"PtraceRegs.R11", Field, 0, ""},
 13971  		{"PtraceRegs.R12", Field, 0, ""},
 13972  		{"PtraceRegs.R13", Field, 0, ""},
 13973  		{"PtraceRegs.R14", Field, 0, ""},
 13974  		{"PtraceRegs.R15", Field, 0, ""},
 13975  		{"PtraceRegs.R8", Field, 0, ""},
 13976  		{"PtraceRegs.R9", Field, 0, ""},
 13977  		{"PtraceRegs.Rax", Field, 0, ""},
 13978  		{"PtraceRegs.Rbp", Field, 0, ""},
 13979  		{"PtraceRegs.Rbx", Field, 0, ""},
 13980  		{"PtraceRegs.Rcx", Field, 0, ""},
 13981  		{"PtraceRegs.Rdi", Field, 0, ""},
 13982  		{"PtraceRegs.Rdx", Field, 0, ""},
 13983  		{"PtraceRegs.Rip", Field, 0, ""},
 13984  		{"PtraceRegs.Rsi", Field, 0, ""},
 13985  		{"PtraceRegs.Rsp", Field, 0, ""},
 13986  		{"PtraceRegs.Ss", Field, 0, ""},
 13987  		{"PtraceRegs.Uregs", Field, 0, ""},
 13988  		{"PtraceRegs.Xcs", Field, 0, ""},
 13989  		{"PtraceRegs.Xds", Field, 0, ""},
 13990  		{"PtraceRegs.Xes", Field, 0, ""},
 13991  		{"PtraceRegs.Xfs", Field, 0, ""},
 13992  		{"PtraceRegs.Xgs", Field, 0, ""},
 13993  		{"PtraceRegs.Xss", Field, 0, ""},
 13994  		{"PtraceSetOptions", Func, 0, "func(pid int, options int) (err error)"},
 13995  		{"PtraceSetRegs", Func, 0, "func(pid int, regs *PtraceRegs) (err error)"},
 13996  		{"PtraceSingleStep", Func, 0, "func(pid int) (err error)"},
 13997  		{"PtraceSyscall", Func, 1, "func(pid int, signal int) (err error)"},
 13998  		{"Pwrite", Func, 0, "func(fd int, p []byte, offset int64) (n int, err error)"},
 13999  		{"REG_BINARY", Const, 0, ""},
 14000  		{"REG_DWORD", Const, 0, ""},
 14001  		{"REG_DWORD_BIG_ENDIAN", Const, 0, ""},
 14002  		{"REG_DWORD_LITTLE_ENDIAN", Const, 0, ""},
 14003  		{"REG_EXPAND_SZ", Const, 0, ""},
 14004  		{"REG_FULL_RESOURCE_DESCRIPTOR", Const, 0, ""},
 14005  		{"REG_LINK", Const, 0, ""},
 14006  		{"REG_MULTI_SZ", Const, 0, ""},
 14007  		{"REG_NONE", Const, 0, ""},
 14008  		{"REG_QWORD", Const, 0, ""},
 14009  		{"REG_QWORD_LITTLE_ENDIAN", Const, 0, ""},
 14010  		{"REG_RESOURCE_LIST", Const, 0, ""},
 14011  		{"REG_RESOURCE_REQUIREMENTS_LIST", Const, 0, ""},
 14012  		{"REG_SZ", Const, 0, ""},
 14013  		{"RLIMIT_AS", Const, 0, ""},
 14014  		{"RLIMIT_CORE", Const, 0, ""},
 14015  		{"RLIMIT_CPU", Const, 0, ""},
 14016  		{"RLIMIT_CPU_USAGE_MONITOR", Const, 16, ""},
 14017  		{"RLIMIT_DATA", Const, 0, ""},
 14018  		{"RLIMIT_FSIZE", Const, 0, ""},
 14019  		{"RLIMIT_NOFILE", Const, 0, ""},
 14020  		{"RLIMIT_STACK", Const, 0, ""},
 14021  		{"RLIM_INFINITY", Const, 0, ""},
 14022  		{"RTAX_ADVMSS", Const, 0, ""},
 14023  		{"RTAX_AUTHOR", Const, 0, ""},
 14024  		{"RTAX_BRD", Const, 0, ""},
 14025  		{"RTAX_CWND", Const, 0, ""},
 14026  		{"RTAX_DST", Const, 0, ""},
 14027  		{"RTAX_FEATURES", Const, 0, ""},
 14028  		{"RTAX_FEATURE_ALLFRAG", Const, 0, ""},
 14029  		{"RTAX_FEATURE_ECN", Const, 0, ""},
 14030  		{"RTAX_FEATURE_SACK", Const, 0, ""},
 14031  		{"RTAX_FEATURE_TIMESTAMP", Const, 0, ""},
 14032  		{"RTAX_GATEWAY", Const, 0, ""},
 14033  		{"RTAX_GENMASK", Const, 0, ""},
 14034  		{"RTAX_HOPLIMIT", Const, 0, ""},
 14035  		{"RTAX_IFA", Const, 0, ""},
 14036  		{"RTAX_IFP", Const, 0, ""},
 14037  		{"RTAX_INITCWND", Const, 0, ""},
 14038  		{"RTAX_INITRWND", Const, 0, ""},
 14039  		{"RTAX_LABEL", Const, 1, ""},
 14040  		{"RTAX_LOCK", Const, 0, ""},
 14041  		{"RTAX_MAX", Const, 0, ""},
 14042  		{"RTAX_MTU", Const, 0, ""},
 14043  		{"RTAX_NETMASK", Const, 0, ""},
 14044  		{"RTAX_REORDERING", Const, 0, ""},
 14045  		{"RTAX_RTO_MIN", Const, 0, ""},
 14046  		{"RTAX_RTT", Const, 0, ""},
 14047  		{"RTAX_RTTVAR", Const, 0, ""},
 14048  		{"RTAX_SRC", Const, 1, ""},
 14049  		{"RTAX_SRCMASK", Const, 1, ""},
 14050  		{"RTAX_SSTHRESH", Const, 0, ""},
 14051  		{"RTAX_TAG", Const, 1, ""},
 14052  		{"RTAX_UNSPEC", Const, 0, ""},
 14053  		{"RTAX_WINDOW", Const, 0, ""},
 14054  		{"RTA_ALIGNTO", Const, 0, ""},
 14055  		{"RTA_AUTHOR", Const, 0, ""},
 14056  		{"RTA_BRD", Const, 0, ""},
 14057  		{"RTA_CACHEINFO", Const, 0, ""},
 14058  		{"RTA_DST", Const, 0, ""},
 14059  		{"RTA_FLOW", Const, 0, ""},
 14060  		{"RTA_GATEWAY", Const, 0, ""},
 14061  		{"RTA_GENMASK", Const, 0, ""},
 14062  		{"RTA_IFA", Const, 0, ""},
 14063  		{"RTA_IFP", Const, 0, ""},
 14064  		{"RTA_IIF", Const, 0, ""},
 14065  		{"RTA_LABEL", Const, 1, ""},
 14066  		{"RTA_MAX", Const, 0, ""},
 14067  		{"RTA_METRICS", Const, 0, ""},
 14068  		{"RTA_MULTIPATH", Const, 0, ""},
 14069  		{"RTA_NETMASK", Const, 0, ""},
 14070  		{"RTA_OIF", Const, 0, ""},
 14071  		{"RTA_PREFSRC", Const, 0, ""},
 14072  		{"RTA_PRIORITY", Const, 0, ""},
 14073  		{"RTA_SRC", Const, 0, ""},
 14074  		{"RTA_SRCMASK", Const, 1, ""},
 14075  		{"RTA_TABLE", Const, 0, ""},
 14076  		{"RTA_TAG", Const, 1, ""},
 14077  		{"RTA_UNSPEC", Const, 0, ""},
 14078  		{"RTCF_DIRECTSRC", Const, 0, ""},
 14079  		{"RTCF_DOREDIRECT", Const, 0, ""},
 14080  		{"RTCF_LOG", Const, 0, ""},
 14081  		{"RTCF_MASQ", Const, 0, ""},
 14082  		{"RTCF_NAT", Const, 0, ""},
 14083  		{"RTCF_VALVE", Const, 0, ""},
 14084  		{"RTF_ADDRCLASSMASK", Const, 0, ""},
 14085  		{"RTF_ADDRCONF", Const, 0, ""},
 14086  		{"RTF_ALLONLINK", Const, 0, ""},
 14087  		{"RTF_ANNOUNCE", Const, 1, ""},
 14088  		{"RTF_BLACKHOLE", Const, 0, ""},
 14089  		{"RTF_BROADCAST", Const, 0, ""},
 14090  		{"RTF_CACHE", Const, 0, ""},
 14091  		{"RTF_CLONED", Const, 1, ""},
 14092  		{"RTF_CLONING", Const, 0, ""},
 14093  		{"RTF_CONDEMNED", Const, 0, ""},
 14094  		{"RTF_DEFAULT", Const, 0, ""},
 14095  		{"RTF_DELCLONE", Const, 0, ""},
 14096  		{"RTF_DONE", Const, 0, ""},
 14097  		{"RTF_DYNAMIC", Const, 0, ""},
 14098  		{"RTF_FLOW", Const, 0, ""},
 14099  		{"RTF_FMASK", Const, 0, ""},
 14100  		{"RTF_GATEWAY", Const, 0, ""},
 14101  		{"RTF_GWFLAG_COMPAT", Const, 3, ""},
 14102  		{"RTF_HOST", Const, 0, ""},
 14103  		{"RTF_IFREF", Const, 0, ""},
 14104  		{"RTF_IFSCOPE", Const, 0, ""},
 14105  		{"RTF_INTERFACE", Const, 0, ""},
 14106  		{"RTF_IRTT", Const, 0, ""},
 14107  		{"RTF_LINKRT", Const, 0, ""},
 14108  		{"RTF_LLDATA", Const, 0, ""},
 14109  		{"RTF_LLINFO", Const, 0, ""},
 14110  		{"RTF_LOCAL", Const, 0, ""},
 14111  		{"RTF_MASK", Const, 1, ""},
 14112  		{"RTF_MODIFIED", Const, 0, ""},
 14113  		{"RTF_MPATH", Const, 1, ""},
 14114  		{"RTF_MPLS", Const, 1, ""},
 14115  		{"RTF_MSS", Const, 0, ""},
 14116  		{"RTF_MTU", Const, 0, ""},
 14117  		{"RTF_MULTICAST", Const, 0, ""},
 14118  		{"RTF_NAT", Const, 0, ""},
 14119  		{"RTF_NOFORWARD", Const, 0, ""},
 14120  		{"RTF_NONEXTHOP", Const, 0, ""},
 14121  		{"RTF_NOPMTUDISC", Const, 0, ""},
 14122  		{"RTF_PERMANENT_ARP", Const, 1, ""},
 14123  		{"RTF_PINNED", Const, 0, ""},
 14124  		{"RTF_POLICY", Const, 0, ""},
 14125  		{"RTF_PRCLONING", Const, 0, ""},
 14126  		{"RTF_PROTO1", Const, 0, ""},
 14127  		{"RTF_PROTO2", Const, 0, ""},
 14128  		{"RTF_PROTO3", Const, 0, ""},
 14129  		{"RTF_PROXY", Const, 16, ""},
 14130  		{"RTF_REINSTATE", Const, 0, ""},
 14131  		{"RTF_REJECT", Const, 0, ""},
 14132  		{"RTF_RNH_LOCKED", Const, 0, ""},
 14133  		{"RTF_ROUTER", Const, 16, ""},
 14134  		{"RTF_SOURCE", Const, 1, ""},
 14135  		{"RTF_SRC", Const, 1, ""},
 14136  		{"RTF_STATIC", Const, 0, ""},
 14137  		{"RTF_STICKY", Const, 0, ""},
 14138  		{"RTF_THROW", Const, 0, ""},
 14139  		{"RTF_TUNNEL", Const, 1, ""},
 14140  		{"RTF_UP", Const, 0, ""},
 14141  		{"RTF_USETRAILERS", Const, 1, ""},
 14142  		{"RTF_WASCLONED", Const, 0, ""},
 14143  		{"RTF_WINDOW", Const, 0, ""},
 14144  		{"RTF_XRESOLVE", Const, 0, ""},
 14145  		{"RTM_ADD", Const, 0, ""},
 14146  		{"RTM_BASE", Const, 0, ""},
 14147  		{"RTM_CHANGE", Const, 0, ""},
 14148  		{"RTM_CHGADDR", Const, 1, ""},
 14149  		{"RTM_DELACTION", Const, 0, ""},
 14150  		{"RTM_DELADDR", Const, 0, ""},
 14151  		{"RTM_DELADDRLABEL", Const, 0, ""},
 14152  		{"RTM_DELETE", Const, 0, ""},
 14153  		{"RTM_DELLINK", Const, 0, ""},
 14154  		{"RTM_DELMADDR", Const, 0, ""},
 14155  		{"RTM_DELNEIGH", Const, 0, ""},
 14156  		{"RTM_DELQDISC", Const, 0, ""},
 14157  		{"RTM_DELROUTE", Const, 0, ""},
 14158  		{"RTM_DELRULE", Const, 0, ""},
 14159  		{"RTM_DELTCLASS", Const, 0, ""},
 14160  		{"RTM_DELTFILTER", Const, 0, ""},
 14161  		{"RTM_DESYNC", Const, 1, ""},
 14162  		{"RTM_F_CLONED", Const, 0, ""},
 14163  		{"RTM_F_EQUALIZE", Const, 0, ""},
 14164  		{"RTM_F_NOTIFY", Const, 0, ""},
 14165  		{"RTM_F_PREFIX", Const, 0, ""},
 14166  		{"RTM_GET", Const, 0, ""},
 14167  		{"RTM_GET2", Const, 0, ""},
 14168  		{"RTM_GETACTION", Const, 0, ""},
 14169  		{"RTM_GETADDR", Const, 0, ""},
 14170  		{"RTM_GETADDRLABEL", Const, 0, ""},
 14171  		{"RTM_GETANYCAST", Const, 0, ""},
 14172  		{"RTM_GETDCB", Const, 0, ""},
 14173  		{"RTM_GETLINK", Const, 0, ""},
 14174  		{"RTM_GETMULTICAST", Const, 0, ""},
 14175  		{"RTM_GETNEIGH", Const, 0, ""},
 14176  		{"RTM_GETNEIGHTBL", Const, 0, ""},
 14177  		{"RTM_GETQDISC", Const, 0, ""},
 14178  		{"RTM_GETROUTE", Const, 0, ""},
 14179  		{"RTM_GETRULE", Const, 0, ""},
 14180  		{"RTM_GETTCLASS", Const, 0, ""},
 14181  		{"RTM_GETTFILTER", Const, 0, ""},
 14182  		{"RTM_IEEE80211", Const, 0, ""},
 14183  		{"RTM_IFANNOUNCE", Const, 0, ""},
 14184  		{"RTM_IFINFO", Const, 0, ""},
 14185  		{"RTM_IFINFO2", Const, 0, ""},
 14186  		{"RTM_LLINFO_UPD", Const, 1, ""},
 14187  		{"RTM_LOCK", Const, 0, ""},
 14188  		{"RTM_LOSING", Const, 0, ""},
 14189  		{"RTM_MAX", Const, 0, ""},
 14190  		{"RTM_MAXSIZE", Const, 1, ""},
 14191  		{"RTM_MISS", Const, 0, ""},
 14192  		{"RTM_NEWACTION", Const, 0, ""},
 14193  		{"RTM_NEWADDR", Const, 0, ""},
 14194  		{"RTM_NEWADDRLABEL", Const, 0, ""},
 14195  		{"RTM_NEWLINK", Const, 0, ""},
 14196  		{"RTM_NEWMADDR", Const, 0, ""},
 14197  		{"RTM_NEWMADDR2", Const, 0, ""},
 14198  		{"RTM_NEWNDUSEROPT", Const, 0, ""},
 14199  		{"RTM_NEWNEIGH", Const, 0, ""},
 14200  		{"RTM_NEWNEIGHTBL", Const, 0, ""},
 14201  		{"RTM_NEWPREFIX", Const, 0, ""},
 14202  		{"RTM_NEWQDISC", Const, 0, ""},
 14203  		{"RTM_NEWROUTE", Const, 0, ""},
 14204  		{"RTM_NEWRULE", Const, 0, ""},
 14205  		{"RTM_NEWTCLASS", Const, 0, ""},
 14206  		{"RTM_NEWTFILTER", Const, 0, ""},
 14207  		{"RTM_NR_FAMILIES", Const, 0, ""},
 14208  		{"RTM_NR_MSGTYPES", Const, 0, ""},
 14209  		{"RTM_OIFINFO", Const, 1, ""},
 14210  		{"RTM_OLDADD", Const, 0, ""},
 14211  		{"RTM_OLDDEL", Const, 0, ""},
 14212  		{"RTM_OOIFINFO", Const, 1, ""},
 14213  		{"RTM_REDIRECT", Const, 0, ""},
 14214  		{"RTM_RESOLVE", Const, 0, ""},
 14215  		{"RTM_RTTUNIT", Const, 0, ""},
 14216  		{"RTM_SETDCB", Const, 0, ""},
 14217  		{"RTM_SETGATE", Const, 1, ""},
 14218  		{"RTM_SETLINK", Const, 0, ""},
 14219  		{"RTM_SETNEIGHTBL", Const, 0, ""},
 14220  		{"RTM_VERSION", Const, 0, ""},
 14221  		{"RTNH_ALIGNTO", Const, 0, ""},
 14222  		{"RTNH_F_DEAD", Const, 0, ""},
 14223  		{"RTNH_F_ONLINK", Const, 0, ""},
 14224  		{"RTNH_F_PERVASIVE", Const, 0, ""},
 14225  		{"RTNLGRP_IPV4_IFADDR", Const, 1, ""},
 14226  		{"RTNLGRP_IPV4_MROUTE", Const, 1, ""},
 14227  		{"RTNLGRP_IPV4_ROUTE", Const, 1, ""},
 14228  		{"RTNLGRP_IPV4_RULE", Const, 1, ""},
 14229  		{"RTNLGRP_IPV6_IFADDR", Const, 1, ""},
 14230  		{"RTNLGRP_IPV6_IFINFO", Const, 1, ""},
 14231  		{"RTNLGRP_IPV6_MROUTE", Const, 1, ""},
 14232  		{"RTNLGRP_IPV6_PREFIX", Const, 1, ""},
 14233  		{"RTNLGRP_IPV6_ROUTE", Const, 1, ""},
 14234  		{"RTNLGRP_IPV6_RULE", Const, 1, ""},
 14235  		{"RTNLGRP_LINK", Const, 1, ""},
 14236  		{"RTNLGRP_ND_USEROPT", Const, 1, ""},
 14237  		{"RTNLGRP_NEIGH", Const, 1, ""},
 14238  		{"RTNLGRP_NONE", Const, 1, ""},
 14239  		{"RTNLGRP_NOTIFY", Const, 1, ""},
 14240  		{"RTNLGRP_TC", Const, 1, ""},
 14241  		{"RTN_ANYCAST", Const, 0, ""},
 14242  		{"RTN_BLACKHOLE", Const, 0, ""},
 14243  		{"RTN_BROADCAST", Const, 0, ""},
 14244  		{"RTN_LOCAL", Const, 0, ""},
 14245  		{"RTN_MAX", Const, 0, ""},
 14246  		{"RTN_MULTICAST", Const, 0, ""},
 14247  		{"RTN_NAT", Const, 0, ""},
 14248  		{"RTN_PROHIBIT", Const, 0, ""},
 14249  		{"RTN_THROW", Const, 0, ""},
 14250  		{"RTN_UNICAST", Const, 0, ""},
 14251  		{"RTN_UNREACHABLE", Const, 0, ""},
 14252  		{"RTN_UNSPEC", Const, 0, ""},
 14253  		{"RTN_XRESOLVE", Const, 0, ""},
 14254  		{"RTPROT_BIRD", Const, 0, ""},
 14255  		{"RTPROT_BOOT", Const, 0, ""},
 14256  		{"RTPROT_DHCP", Const, 0, ""},
 14257  		{"RTPROT_DNROUTED", Const, 0, ""},
 14258  		{"RTPROT_GATED", Const, 0, ""},
 14259  		{"RTPROT_KERNEL", Const, 0, ""},
 14260  		{"RTPROT_MRT", Const, 0, ""},
 14261  		{"RTPROT_NTK", Const, 0, ""},
 14262  		{"RTPROT_RA", Const, 0, ""},
 14263  		{"RTPROT_REDIRECT", Const, 0, ""},
 14264  		{"RTPROT_STATIC", Const, 0, ""},
 14265  		{"RTPROT_UNSPEC", Const, 0, ""},
 14266  		{"RTPROT_XORP", Const, 0, ""},
 14267  		{"RTPROT_ZEBRA", Const, 0, ""},
 14268  		{"RTV_EXPIRE", Const, 0, ""},
 14269  		{"RTV_HOPCOUNT", Const, 0, ""},
 14270  		{"RTV_MTU", Const, 0, ""},
 14271  		{"RTV_RPIPE", Const, 0, ""},
 14272  		{"RTV_RTT", Const, 0, ""},
 14273  		{"RTV_RTTVAR", Const, 0, ""},
 14274  		{"RTV_SPIPE", Const, 0, ""},
 14275  		{"RTV_SSTHRESH", Const, 0, ""},
 14276  		{"RTV_WEIGHT", Const, 0, ""},
 14277  		{"RT_CACHING_CONTEXT", Const, 1, ""},
 14278  		{"RT_CLASS_DEFAULT", Const, 0, ""},
 14279  		{"RT_CLASS_LOCAL", Const, 0, ""},
 14280  		{"RT_CLASS_MAIN", Const, 0, ""},
 14281  		{"RT_CLASS_MAX", Const, 0, ""},
 14282  		{"RT_CLASS_UNSPEC", Const, 0, ""},
 14283  		{"RT_DEFAULT_FIB", Const, 1, ""},
 14284  		{"RT_NORTREF", Const, 1, ""},
 14285  		{"RT_SCOPE_HOST", Const, 0, ""},
 14286  		{"RT_SCOPE_LINK", Const, 0, ""},
 14287  		{"RT_SCOPE_NOWHERE", Const, 0, ""},
 14288  		{"RT_SCOPE_SITE", Const, 0, ""},
 14289  		{"RT_SCOPE_UNIVERSE", Const, 0, ""},
 14290  		{"RT_TABLEID_MAX", Const, 1, ""},
 14291  		{"RT_TABLE_COMPAT", Const, 0, ""},
 14292  		{"RT_TABLE_DEFAULT", Const, 0, ""},
 14293  		{"RT_TABLE_LOCAL", Const, 0, ""},
 14294  		{"RT_TABLE_MAIN", Const, 0, ""},
 14295  		{"RT_TABLE_MAX", Const, 0, ""},
 14296  		{"RT_TABLE_UNSPEC", Const, 0, ""},
 14297  		{"RUSAGE_CHILDREN", Const, 0, ""},
 14298  		{"RUSAGE_SELF", Const, 0, ""},
 14299  		{"RUSAGE_THREAD", Const, 0, ""},
 14300  		{"Radvisory_t", Type, 0, ""},
 14301  		{"Radvisory_t.Count", Field, 0, ""},
 14302  		{"Radvisory_t.Offset", Field, 0, ""},
 14303  		{"Radvisory_t.Pad_cgo_0", Field, 0, ""},
 14304  		{"RawConn", Type, 9, ""},
 14305  		{"RawSockaddr", Type, 0, ""},
 14306  		{"RawSockaddr.Data", Field, 0, ""},
 14307  		{"RawSockaddr.Family", Field, 0, ""},
 14308  		{"RawSockaddr.Len", Field, 0, ""},
 14309  		{"RawSockaddrAny", Type, 0, ""},
 14310  		{"RawSockaddrAny.Addr", Field, 0, ""},
 14311  		{"RawSockaddrAny.Pad", Field, 0, ""},
 14312  		{"RawSockaddrDatalink", Type, 0, ""},
 14313  		{"RawSockaddrDatalink.Alen", Field, 0, ""},
 14314  		{"RawSockaddrDatalink.Data", Field, 0, ""},
 14315  		{"RawSockaddrDatalink.Family", Field, 0, ""},
 14316  		{"RawSockaddrDatalink.Index", Field, 0, ""},
 14317  		{"RawSockaddrDatalink.Len", Field, 0, ""},
 14318  		{"RawSockaddrDatalink.Nlen", Field, 0, ""},
 14319  		{"RawSockaddrDatalink.Pad_cgo_0", Field, 2, ""},
 14320  		{"RawSockaddrDatalink.Slen", Field, 0, ""},
 14321  		{"RawSockaddrDatalink.Type", Field, 0, ""},
 14322  		{"RawSockaddrInet4", Type, 0, ""},
 14323  		{"RawSockaddrInet4.Addr", Field, 0, ""},
 14324  		{"RawSockaddrInet4.Family", Field, 0, ""},
 14325  		{"RawSockaddrInet4.Len", Field, 0, ""},
 14326  		{"RawSockaddrInet4.Port", Field, 0, ""},
 14327  		{"RawSockaddrInet4.Zero", Field, 0, ""},
 14328  		{"RawSockaddrInet6", Type, 0, ""},
 14329  		{"RawSockaddrInet6.Addr", Field, 0, ""},
 14330  		{"RawSockaddrInet6.Family", Field, 0, ""},
 14331  		{"RawSockaddrInet6.Flowinfo", Field, 0, ""},
 14332  		{"RawSockaddrInet6.Len", Field, 0, ""},
 14333  		{"RawSockaddrInet6.Port", Field, 0, ""},
 14334  		{"RawSockaddrInet6.Scope_id", Field, 0, ""},
 14335  		{"RawSockaddrLinklayer", Type, 0, ""},
 14336  		{"RawSockaddrLinklayer.Addr", Field, 0, ""},
 14337  		{"RawSockaddrLinklayer.Family", Field, 0, ""},
 14338  		{"RawSockaddrLinklayer.Halen", Field, 0, ""},
 14339  		{"RawSockaddrLinklayer.Hatype", Field, 0, ""},
 14340  		{"RawSockaddrLinklayer.Ifindex", Field, 0, ""},
 14341  		{"RawSockaddrLinklayer.Pkttype", Field, 0, ""},
 14342  		{"RawSockaddrLinklayer.Protocol", Field, 0, ""},
 14343  		{"RawSockaddrNetlink", Type, 0, ""},
 14344  		{"RawSockaddrNetlink.Family", Field, 0, ""},
 14345  		{"RawSockaddrNetlink.Groups", Field, 0, ""},
 14346  		{"RawSockaddrNetlink.Pad", Field, 0, ""},
 14347  		{"RawSockaddrNetlink.Pid", Field, 0, ""},
 14348  		{"RawSockaddrUnix", Type, 0, ""},
 14349  		{"RawSockaddrUnix.Family", Field, 0, ""},
 14350  		{"RawSockaddrUnix.Len", Field, 0, ""},
 14351  		{"RawSockaddrUnix.Pad_cgo_0", Field, 2, ""},
 14352  		{"RawSockaddrUnix.Path", Field, 0, ""},
 14353  		{"RawSyscall", Func, 0, "func(trap uintptr, a1 uintptr, a2 uintptr, a3 uintptr) (r1 uintptr, r2 uintptr, err Errno)"},
 14354  		{"RawSyscall6", Func, 0, "func(trap uintptr, a1 uintptr, a2 uintptr, a3 uintptr, a4 uintptr, a5 uintptr, a6 uintptr) (r1 uintptr, r2 uintptr, err Errno)"},
 14355  		{"Read", Func, 0, "func(fd int, p []byte) (n int, err error)"},
 14356  		{"ReadConsole", Func, 1, ""},
 14357  		{"ReadDirectoryChanges", Func, 0, ""},
 14358  		{"ReadDirent", Func, 0, "func(fd int, buf []byte) (n int, err error)"},
 14359  		{"ReadFile", Func, 0, ""},
 14360  		{"Readlink", Func, 0, "func(path string, buf []byte) (n int, err error)"},
 14361  		{"Reboot", Func, 0, "func(cmd int) (err error)"},
 14362  		{"Recvfrom", Func, 0, "func(fd int, p []byte, flags int) (n int, from Sockaddr, err error)"},
 14363  		{"Recvmsg", Func, 0, "func(fd int, p []byte, oob []byte, flags int) (n int, oobn int, recvflags int, from Sockaddr, err error)"},
 14364  		{"RegCloseKey", Func, 0, ""},
 14365  		{"RegEnumKeyEx", Func, 0, ""},
 14366  		{"RegOpenKeyEx", Func, 0, ""},
 14367  		{"RegQueryInfoKey", Func, 0, ""},
 14368  		{"RegQueryValueEx", Func, 0, ""},
 14369  		{"RemoveDirectory", Func, 0, ""},
 14370  		{"Removexattr", Func, 1, "func(path string, attr string) (err error)"},
 14371  		{"Rename", Func, 0, "func(oldpath string, newpath string) (err error)"},
 14372  		{"Renameat", Func, 0, "func(olddirfd int, oldpath string, newdirfd int, newpath string) (err error)"},
 14373  		{"Revoke", Func, 0, ""},
 14374  		{"Rlimit", Type, 0, ""},
 14375  		{"Rlimit.Cur", Field, 0, ""},
 14376  		{"Rlimit.Max", Field, 0, ""},
 14377  		{"Rmdir", Func, 0, "func(path string) error"},
 14378  		{"RouteMessage", Type, 0, ""},
 14379  		{"RouteMessage.Data", Field, 0, ""},
 14380  		{"RouteMessage.Header", Field, 0, ""},
 14381  		{"RouteRIB", Func, 0, ""},
 14382  		{"RoutingMessage", Type, 0, ""},
 14383  		{"RtAttr", Type, 0, ""},
 14384  		{"RtAttr.Len", Field, 0, ""},
 14385  		{"RtAttr.Type", Field, 0, ""},
 14386  		{"RtGenmsg", Type, 0, ""},
 14387  		{"RtGenmsg.Family", Field, 0, ""},
 14388  		{"RtMetrics", Type, 0, ""},
 14389  		{"RtMetrics.Expire", Field, 0, ""},
 14390  		{"RtMetrics.Filler", Field, 0, ""},
 14391  		{"RtMetrics.Hopcount", Field, 0, ""},
 14392  		{"RtMetrics.Locks", Field, 0, ""},
 14393  		{"RtMetrics.Mtu", Field, 0, ""},
 14394  		{"RtMetrics.Pad", Field, 3, ""},
 14395  		{"RtMetrics.Pksent", Field, 0, ""},
 14396  		{"RtMetrics.Recvpipe", Field, 0, ""},
 14397  		{"RtMetrics.Refcnt", Field, 2, ""},
 14398  		{"RtMetrics.Rtt", Field, 0, ""},
 14399  		{"RtMetrics.Rttvar", Field, 0, ""},
 14400  		{"RtMetrics.Sendpipe", Field, 0, ""},
 14401  		{"RtMetrics.Ssthresh", Field, 0, ""},
 14402  		{"RtMetrics.Weight", Field, 0, ""},
 14403  		{"RtMsg", Type, 0, ""},
 14404  		{"RtMsg.Dst_len", Field, 0, ""},
 14405  		{"RtMsg.Family", Field, 0, ""},
 14406  		{"RtMsg.Flags", Field, 0, ""},
 14407  		{"RtMsg.Protocol", Field, 0, ""},
 14408  		{"RtMsg.Scope", Field, 0, ""},
 14409  		{"RtMsg.Src_len", Field, 0, ""},
 14410  		{"RtMsg.Table", Field, 0, ""},
 14411  		{"RtMsg.Tos", Field, 0, ""},
 14412  		{"RtMsg.Type", Field, 0, ""},
 14413  		{"RtMsghdr", Type, 0, ""},
 14414  		{"RtMsghdr.Addrs", Field, 0, ""},
 14415  		{"RtMsghdr.Errno", Field, 0, ""},
 14416  		{"RtMsghdr.Flags", Field, 0, ""},
 14417  		{"RtMsghdr.Fmask", Field, 0, ""},
 14418  		{"RtMsghdr.Hdrlen", Field, 2, ""},
 14419  		{"RtMsghdr.Index", Field, 0, ""},
 14420  		{"RtMsghdr.Inits", Field, 0, ""},
 14421  		{"RtMsghdr.Mpls", Field, 2, ""},
 14422  		{"RtMsghdr.Msglen", Field, 0, ""},
 14423  		{"RtMsghdr.Pad_cgo_0", Field, 0, ""},
 14424  		{"RtMsghdr.Pad_cgo_1", Field, 2, ""},
 14425  		{"RtMsghdr.Pid", Field, 0, ""},
 14426  		{"RtMsghdr.Priority", Field, 2, ""},
 14427  		{"RtMsghdr.Rmx", Field, 0, ""},
 14428  		{"RtMsghdr.Seq", Field, 0, ""},
 14429  		{"RtMsghdr.Tableid", Field, 2, ""},
 14430  		{"RtMsghdr.Type", Field, 0, ""},
 14431  		{"RtMsghdr.Use", Field, 0, ""},
 14432  		{"RtMsghdr.Version", Field, 0, ""},
 14433  		{"RtNexthop", Type, 0, ""},
 14434  		{"RtNexthop.Flags", Field, 0, ""},
 14435  		{"RtNexthop.Hops", Field, 0, ""},
 14436  		{"RtNexthop.Ifindex", Field, 0, ""},
 14437  		{"RtNexthop.Len", Field, 0, ""},
 14438  		{"Rusage", Type, 0, ""},
 14439  		{"Rusage.CreationTime", Field, 0, ""},
 14440  		{"Rusage.ExitTime", Field, 0, ""},
 14441  		{"Rusage.Idrss", Field, 0, ""},
 14442  		{"Rusage.Inblock", Field, 0, ""},
 14443  		{"Rusage.Isrss", Field, 0, ""},
 14444  		{"Rusage.Ixrss", Field, 0, ""},
 14445  		{"Rusage.KernelTime", Field, 0, ""},
 14446  		{"Rusage.Majflt", Field, 0, ""},
 14447  		{"Rusage.Maxrss", Field, 0, ""},
 14448  		{"Rusage.Minflt", Field, 0, ""},
 14449  		{"Rusage.Msgrcv", Field, 0, ""},
 14450  		{"Rusage.Msgsnd", Field, 0, ""},
 14451  		{"Rusage.Nivcsw", Field, 0, ""},
 14452  		{"Rusage.Nsignals", Field, 0, ""},
 14453  		{"Rusage.Nswap", Field, 0, ""},
 14454  		{"Rusage.Nvcsw", Field, 0, ""},
 14455  		{"Rusage.Oublock", Field, 0, ""},
 14456  		{"Rusage.Stime", Field, 0, ""},
 14457  		{"Rusage.UserTime", Field, 0, ""},
 14458  		{"Rusage.Utime", Field, 0, ""},
 14459  		{"SCM_BINTIME", Const, 0, ""},
 14460  		{"SCM_CREDENTIALS", Const, 0, ""},
 14461  		{"SCM_CREDS", Const, 0, ""},
 14462  		{"SCM_RIGHTS", Const, 0, ""},
 14463  		{"SCM_TIMESTAMP", Const, 0, ""},
 14464  		{"SCM_TIMESTAMPING", Const, 0, ""},
 14465  		{"SCM_TIMESTAMPNS", Const, 0, ""},
 14466  		{"SCM_TIMESTAMP_MONOTONIC", Const, 0, ""},
 14467  		{"SHUT_RD", Const, 0, ""},
 14468  		{"SHUT_RDWR", Const, 0, ""},
 14469  		{"SHUT_WR", Const, 0, ""},
 14470  		{"SID", Type, 0, ""},
 14471  		{"SIDAndAttributes", Type, 0, ""},
 14472  		{"SIDAndAttributes.Attributes", Field, 0, ""},
 14473  		{"SIDAndAttributes.Sid", Field, 0, ""},
 14474  		{"SIGABRT", Const, 0, ""},
 14475  		{"SIGALRM", Const, 0, ""},
 14476  		{"SIGBUS", Const, 0, ""},
 14477  		{"SIGCHLD", Const, 0, ""},
 14478  		{"SIGCLD", Const, 0, ""},
 14479  		{"SIGCONT", Const, 0, ""},
 14480  		{"SIGEMT", Const, 0, ""},
 14481  		{"SIGFPE", Const, 0, ""},
 14482  		{"SIGHUP", Const, 0, ""},
 14483  		{"SIGILL", Const, 0, ""},
 14484  		{"SIGINFO", Const, 0, ""},
 14485  		{"SIGINT", Const, 0, ""},
 14486  		{"SIGIO", Const, 0, ""},
 14487  		{"SIGIOT", Const, 0, ""},
 14488  		{"SIGKILL", Const, 0, ""},
 14489  		{"SIGLIBRT", Const, 1, ""},
 14490  		{"SIGLWP", Const, 0, ""},
 14491  		{"SIGPIPE", Const, 0, ""},
 14492  		{"SIGPOLL", Const, 0, ""},
 14493  		{"SIGPROF", Const, 0, ""},
 14494  		{"SIGPWR", Const, 0, ""},
 14495  		{"SIGQUIT", Const, 0, ""},
 14496  		{"SIGSEGV", Const, 0, ""},
 14497  		{"SIGSTKFLT", Const, 0, ""},
 14498  		{"SIGSTOP", Const, 0, ""},
 14499  		{"SIGSYS", Const, 0, ""},
 14500  		{"SIGTERM", Const, 0, ""},
 14501  		{"SIGTHR", Const, 0, ""},
 14502  		{"SIGTRAP", Const, 0, ""},
 14503  		{"SIGTSTP", Const, 0, ""},
 14504  		{"SIGTTIN", Const, 0, ""},
 14505  		{"SIGTTOU", Const, 0, ""},
 14506  		{"SIGUNUSED", Const, 0, ""},
 14507  		{"SIGURG", Const, 0, ""},
 14508  		{"SIGUSR1", Const, 0, ""},
 14509  		{"SIGUSR2", Const, 0, ""},
 14510  		{"SIGVTALRM", Const, 0, ""},
 14511  		{"SIGWINCH", Const, 0, ""},
 14512  		{"SIGXCPU", Const, 0, ""},
 14513  		{"SIGXFSZ", Const, 0, ""},
 14514  		{"SIOCADDDLCI", Const, 0, ""},
 14515  		{"SIOCADDMULTI", Const, 0, ""},
 14516  		{"SIOCADDRT", Const, 0, ""},
 14517  		{"SIOCAIFADDR", Const, 0, ""},
 14518  		{"SIOCAIFGROUP", Const, 0, ""},
 14519  		{"SIOCALIFADDR", Const, 0, ""},
 14520  		{"SIOCARPIPLL", Const, 0, ""},
 14521  		{"SIOCATMARK", Const, 0, ""},
 14522  		{"SIOCAUTOADDR", Const, 0, ""},
 14523  		{"SIOCAUTONETMASK", Const, 0, ""},
 14524  		{"SIOCBRDGADD", Const, 1, ""},
 14525  		{"SIOCBRDGADDS", Const, 1, ""},
 14526  		{"SIOCBRDGARL", Const, 1, ""},
 14527  		{"SIOCBRDGDADDR", Const, 1, ""},
 14528  		{"SIOCBRDGDEL", Const, 1, ""},
 14529  		{"SIOCBRDGDELS", Const, 1, ""},
 14530  		{"SIOCBRDGFLUSH", Const, 1, ""},
 14531  		{"SIOCBRDGFRL", Const, 1, ""},
 14532  		{"SIOCBRDGGCACHE", Const, 1, ""},
 14533  		{"SIOCBRDGGFD", Const, 1, ""},
 14534  		{"SIOCBRDGGHT", Const, 1, ""},
 14535  		{"SIOCBRDGGIFFLGS", Const, 1, ""},
 14536  		{"SIOCBRDGGMA", Const, 1, ""},
 14537  		{"SIOCBRDGGPARAM", Const, 1, ""},
 14538  		{"SIOCBRDGGPRI", Const, 1, ""},
 14539  		{"SIOCBRDGGRL", Const, 1, ""},
 14540  		{"SIOCBRDGGSIFS", Const, 1, ""},
 14541  		{"SIOCBRDGGTO", Const, 1, ""},
 14542  		{"SIOCBRDGIFS", Const, 1, ""},
 14543  		{"SIOCBRDGRTS", Const, 1, ""},
 14544  		{"SIOCBRDGSADDR", Const, 1, ""},
 14545  		{"SIOCBRDGSCACHE", Const, 1, ""},
 14546  		{"SIOCBRDGSFD", Const, 1, ""},
 14547  		{"SIOCBRDGSHT", Const, 1, ""},
 14548  		{"SIOCBRDGSIFCOST", Const, 1, ""},
 14549  		{"SIOCBRDGSIFFLGS", Const, 1, ""},
 14550  		{"SIOCBRDGSIFPRIO", Const, 1, ""},
 14551  		{"SIOCBRDGSMA", Const, 1, ""},
 14552  		{"SIOCBRDGSPRI", Const, 1, ""},
 14553  		{"SIOCBRDGSPROTO", Const, 1, ""},
 14554  		{"SIOCBRDGSTO", Const, 1, ""},
 14555  		{"SIOCBRDGSTXHC", Const, 1, ""},
 14556  		{"SIOCDARP", Const, 0, ""},
 14557  		{"SIOCDELDLCI", Const, 0, ""},
 14558  		{"SIOCDELMULTI", Const, 0, ""},
 14559  		{"SIOCDELRT", Const, 0, ""},
 14560  		{"SIOCDEVPRIVATE", Const, 0, ""},
 14561  		{"SIOCDIFADDR", Const, 0, ""},
 14562  		{"SIOCDIFGROUP", Const, 0, ""},
 14563  		{"SIOCDIFPHYADDR", Const, 0, ""},
 14564  		{"SIOCDLIFADDR", Const, 0, ""},
 14565  		{"SIOCDRARP", Const, 0, ""},
 14566  		{"SIOCGARP", Const, 0, ""},
 14567  		{"SIOCGDRVSPEC", Const, 0, ""},
 14568  		{"SIOCGETKALIVE", Const, 1, ""},
 14569  		{"SIOCGETLABEL", Const, 1, ""},
 14570  		{"SIOCGETPFLOW", Const, 1, ""},
 14571  		{"SIOCGETPFSYNC", Const, 1, ""},
 14572  		{"SIOCGETSGCNT", Const, 0, ""},
 14573  		{"SIOCGETVIFCNT", Const, 0, ""},
 14574  		{"SIOCGETVLAN", Const, 0, ""},
 14575  		{"SIOCGHIWAT", Const, 0, ""},
 14576  		{"SIOCGIFADDR", Const, 0, ""},
 14577  		{"SIOCGIFADDRPREF", Const, 1, ""},
 14578  		{"SIOCGIFALIAS", Const, 1, ""},
 14579  		{"SIOCGIFALTMTU", Const, 0, ""},
 14580  		{"SIOCGIFASYNCMAP", Const, 0, ""},
 14581  		{"SIOCGIFBOND", Const, 0, ""},
 14582  		{"SIOCGIFBR", Const, 0, ""},
 14583  		{"SIOCGIFBRDADDR", Const, 0, ""},
 14584  		{"SIOCGIFCAP", Const, 0, ""},
 14585  		{"SIOCGIFCONF", Const, 0, ""},
 14586  		{"SIOCGIFCOUNT", Const, 0, ""},
 14587  		{"SIOCGIFDATA", Const, 1, ""},
 14588  		{"SIOCGIFDESCR", Const, 0, ""},
 14589  		{"SIOCGIFDEVMTU", Const, 0, ""},
 14590  		{"SIOCGIFDLT", Const, 1, ""},
 14591  		{"SIOCGIFDSTADDR", Const, 0, ""},
 14592  		{"SIOCGIFENCAP", Const, 0, ""},
 14593  		{"SIOCGIFFIB", Const, 1, ""},
 14594  		{"SIOCGIFFLAGS", Const, 0, ""},
 14595  		{"SIOCGIFGATTR", Const, 1, ""},
 14596  		{"SIOCGIFGENERIC", Const, 0, ""},
 14597  		{"SIOCGIFGMEMB", Const, 0, ""},
 14598  		{"SIOCGIFGROUP", Const, 0, ""},
 14599  		{"SIOCGIFHARDMTU", Const, 3, ""},
 14600  		{"SIOCGIFHWADDR", Const, 0, ""},
 14601  		{"SIOCGIFINDEX", Const, 0, ""},
 14602  		{"SIOCGIFKPI", Const, 0, ""},
 14603  		{"SIOCGIFMAC", Const, 0, ""},
 14604  		{"SIOCGIFMAP", Const, 0, ""},
 14605  		{"SIOCGIFMEDIA", Const, 0, ""},
 14606  		{"SIOCGIFMEM", Const, 0, ""},
 14607  		{"SIOCGIFMETRIC", Const, 0, ""},
 14608  		{"SIOCGIFMTU", Const, 0, ""},
 14609  		{"SIOCGIFNAME", Const, 0, ""},
 14610  		{"SIOCGIFNETMASK", Const, 0, ""},
 14611  		{"SIOCGIFPDSTADDR", Const, 0, ""},
 14612  		{"SIOCGIFPFLAGS", Const, 0, ""},
 14613  		{"SIOCGIFPHYS", Const, 0, ""},
 14614  		{"SIOCGIFPRIORITY", Const, 1, ""},
 14615  		{"SIOCGIFPSRCADDR", Const, 0, ""},
 14616  		{"SIOCGIFRDOMAIN", Const, 1, ""},
 14617  		{"SIOCGIFRTLABEL", Const, 1, ""},
 14618  		{"SIOCGIFSLAVE", Const, 0, ""},
 14619  		{"SIOCGIFSTATUS", Const, 0, ""},
 14620  		{"SIOCGIFTIMESLOT", Const, 1, ""},
 14621  		{"SIOCGIFTXQLEN", Const, 0, ""},
 14622  		{"SIOCGIFVLAN", Const, 0, ""},
 14623  		{"SIOCGIFWAKEFLAGS", Const, 0, ""},
 14624  		{"SIOCGIFXFLAGS", Const, 1, ""},
 14625  		{"SIOCGLIFADDR", Const, 0, ""},
 14626  		{"SIOCGLIFPHYADDR", Const, 0, ""},
 14627  		{"SIOCGLIFPHYRTABLE", Const, 1, ""},
 14628  		{"SIOCGLIFPHYTTL", Const, 3, ""},
 14629  		{"SIOCGLINKSTR", Const, 1, ""},
 14630  		{"SIOCGLOWAT", Const, 0, ""},
 14631  		{"SIOCGPGRP", Const, 0, ""},
 14632  		{"SIOCGPRIVATE_0", Const, 0, ""},
 14633  		{"SIOCGPRIVATE_1", Const, 0, ""},
 14634  		{"SIOCGRARP", Const, 0, ""},
 14635  		{"SIOCGSPPPPARAMS", Const, 3, ""},
 14636  		{"SIOCGSTAMP", Const, 0, ""},
 14637  		{"SIOCGSTAMPNS", Const, 0, ""},
 14638  		{"SIOCGVH", Const, 1, ""},
 14639  		{"SIOCGVNETID", Const, 3, ""},
 14640  		{"SIOCIFCREATE", Const, 0, ""},
 14641  		{"SIOCIFCREATE2", Const, 0, ""},
 14642  		{"SIOCIFDESTROY", Const, 0, ""},
 14643  		{"SIOCIFGCLONERS", Const, 0, ""},
 14644  		{"SIOCINITIFADDR", Const, 1, ""},
 14645  		{"SIOCPROTOPRIVATE", Const, 0, ""},
 14646  		{"SIOCRSLVMULTI", Const, 0, ""},
 14647  		{"SIOCRTMSG", Const, 0, ""},
 14648  		{"SIOCSARP", Const, 0, ""},
 14649  		{"SIOCSDRVSPEC", Const, 0, ""},
 14650  		{"SIOCSETKALIVE", Const, 1, ""},
 14651  		{"SIOCSETLABEL", Const, 1, ""},
 14652  		{"SIOCSETPFLOW", Const, 1, ""},
 14653  		{"SIOCSETPFSYNC", Const, 1, ""},
 14654  		{"SIOCSETVLAN", Const, 0, ""},
 14655  		{"SIOCSHIWAT", Const, 0, ""},
 14656  		{"SIOCSIFADDR", Const, 0, ""},
 14657  		{"SIOCSIFADDRPREF", Const, 1, ""},
 14658  		{"SIOCSIFALTMTU", Const, 0, ""},
 14659  		{"SIOCSIFASYNCMAP", Const, 0, ""},
 14660  		{"SIOCSIFBOND", Const, 0, ""},
 14661  		{"SIOCSIFBR", Const, 0, ""},
 14662  		{"SIOCSIFBRDADDR", Const, 0, ""},
 14663  		{"SIOCSIFCAP", Const, 0, ""},
 14664  		{"SIOCSIFDESCR", Const, 0, ""},
 14665  		{"SIOCSIFDSTADDR", Const, 0, ""},
 14666  		{"SIOCSIFENCAP", Const, 0, ""},
 14667  		{"SIOCSIFFIB", Const, 1, ""},
 14668  		{"SIOCSIFFLAGS", Const, 0, ""},
 14669  		{"SIOCSIFGATTR", Const, 1, ""},
 14670  		{"SIOCSIFGENERIC", Const, 0, ""},
 14671  		{"SIOCSIFHWADDR", Const, 0, ""},
 14672  		{"SIOCSIFHWBROADCAST", Const, 0, ""},
 14673  		{"SIOCSIFKPI", Const, 0, ""},
 14674  		{"SIOCSIFLINK", Const, 0, ""},
 14675  		{"SIOCSIFLLADDR", Const, 0, ""},
 14676  		{"SIOCSIFMAC", Const, 0, ""},
 14677  		{"SIOCSIFMAP", Const, 0, ""},
 14678  		{"SIOCSIFMEDIA", Const, 0, ""},
 14679  		{"SIOCSIFMEM", Const, 0, ""},
 14680  		{"SIOCSIFMETRIC", Const, 0, ""},
 14681  		{"SIOCSIFMTU", Const, 0, ""},
 14682  		{"SIOCSIFNAME", Const, 0, ""},
 14683  		{"SIOCSIFNETMASK", Const, 0, ""},
 14684  		{"SIOCSIFPFLAGS", Const, 0, ""},
 14685  		{"SIOCSIFPHYADDR", Const, 0, ""},
 14686  		{"SIOCSIFPHYS", Const, 0, ""},
 14687  		{"SIOCSIFPRIORITY", Const, 1, ""},
 14688  		{"SIOCSIFRDOMAIN", Const, 1, ""},
 14689  		{"SIOCSIFRTLABEL", Const, 1, ""},
 14690  		{"SIOCSIFRVNET", Const, 0, ""},
 14691  		{"SIOCSIFSLAVE", Const, 0, ""},
 14692  		{"SIOCSIFTIMESLOT", Const, 1, ""},
 14693  		{"SIOCSIFTXQLEN", Const, 0, ""},
 14694  		{"SIOCSIFVLAN", Const, 0, ""},
 14695  		{"SIOCSIFVNET", Const, 0, ""},
 14696  		{"SIOCSIFXFLAGS", Const, 1, ""},
 14697  		{"SIOCSLIFPHYADDR", Const, 0, ""},
 14698  		{"SIOCSLIFPHYRTABLE", Const, 1, ""},
 14699  		{"SIOCSLIFPHYTTL", Const, 3, ""},
 14700  		{"SIOCSLINKSTR", Const, 1, ""},
 14701  		{"SIOCSLOWAT", Const, 0, ""},
 14702  		{"SIOCSPGRP", Const, 0, ""},
 14703  		{"SIOCSRARP", Const, 0, ""},
 14704  		{"SIOCSSPPPPARAMS", Const, 3, ""},
 14705  		{"SIOCSVH", Const, 1, ""},
 14706  		{"SIOCSVNETID", Const, 3, ""},
 14707  		{"SIOCZIFDATA", Const, 1, ""},
 14708  		{"SIO_GET_EXTENSION_FUNCTION_POINTER", Const, 1, ""},
 14709  		{"SIO_GET_INTERFACE_LIST", Const, 0, ""},
 14710  		{"SIO_KEEPALIVE_VALS", Const, 3, ""},
 14711  		{"SIO_UDP_CONNRESET", Const, 4, ""},
 14712  		{"SOCK_CLOEXEC", Const, 0, ""},
 14713  		{"SOCK_DCCP", Const, 0, ""},
 14714  		{"SOCK_DGRAM", Const, 0, ""},
 14715  		{"SOCK_FLAGS_MASK", Const, 1, ""},
 14716  		{"SOCK_MAXADDRLEN", Const, 0, ""},
 14717  		{"SOCK_NONBLOCK", Const, 0, ""},
 14718  		{"SOCK_NOSIGPIPE", Const, 1, ""},
 14719  		{"SOCK_PACKET", Const, 0, ""},
 14720  		{"SOCK_RAW", Const, 0, ""},
 14721  		{"SOCK_RDM", Const, 0, ""},
 14722  		{"SOCK_SEQPACKET", Const, 0, ""},
 14723  		{"SOCK_STREAM", Const, 0, ""},
 14724  		{"SOL_AAL", Const, 0, ""},
 14725  		{"SOL_ATM", Const, 0, ""},
 14726  		{"SOL_DECNET", Const, 0, ""},
 14727  		{"SOL_ICMPV6", Const, 0, ""},
 14728  		{"SOL_IP", Const, 0, ""},
 14729  		{"SOL_IPV6", Const, 0, ""},
 14730  		{"SOL_IRDA", Const, 0, ""},
 14731  		{"SOL_PACKET", Const, 0, ""},
 14732  		{"SOL_RAW", Const, 0, ""},
 14733  		{"SOL_SOCKET", Const, 0, ""},
 14734  		{"SOL_TCP", Const, 0, ""},
 14735  		{"SOL_X25", Const, 0, ""},
 14736  		{"SOMAXCONN", Const, 0, ""},
 14737  		{"SO_ACCEPTCONN", Const, 0, ""},
 14738  		{"SO_ACCEPTFILTER", Const, 0, ""},
 14739  		{"SO_ATTACH_FILTER", Const, 0, ""},
 14740  		{"SO_BINDANY", Const, 1, ""},
 14741  		{"SO_BINDTODEVICE", Const, 0, ""},
 14742  		{"SO_BINTIME", Const, 0, ""},
 14743  		{"SO_BROADCAST", Const, 0, ""},
 14744  		{"SO_BSDCOMPAT", Const, 0, ""},
 14745  		{"SO_DEBUG", Const, 0, ""},
 14746  		{"SO_DETACH_FILTER", Const, 0, ""},
 14747  		{"SO_DOMAIN", Const, 0, ""},
 14748  		{"SO_DONTROUTE", Const, 0, ""},
 14749  		{"SO_DONTTRUNC", Const, 0, ""},
 14750  		{"SO_ERROR", Const, 0, ""},
 14751  		{"SO_KEEPALIVE", Const, 0, ""},
 14752  		{"SO_LABEL", Const, 0, ""},
 14753  		{"SO_LINGER", Const, 0, ""},
 14754  		{"SO_LINGER_SEC", Const, 0, ""},
 14755  		{"SO_LISTENINCQLEN", Const, 0, ""},
 14756  		{"SO_LISTENQLEN", Const, 0, ""},
 14757  		{"SO_LISTENQLIMIT", Const, 0, ""},
 14758  		{"SO_MARK", Const, 0, ""},
 14759  		{"SO_NETPROC", Const, 1, ""},
 14760  		{"SO_NKE", Const, 0, ""},
 14761  		{"SO_NOADDRERR", Const, 0, ""},
 14762  		{"SO_NOHEADER", Const, 1, ""},
 14763  		{"SO_NOSIGPIPE", Const, 0, ""},
 14764  		{"SO_NOTIFYCONFLICT", Const, 0, ""},
 14765  		{"SO_NO_CHECK", Const, 0, ""},
 14766  		{"SO_NO_DDP", Const, 0, ""},
 14767  		{"SO_NO_OFFLOAD", Const, 0, ""},
 14768  		{"SO_NP_EXTENSIONS", Const, 0, ""},
 14769  		{"SO_NREAD", Const, 0, ""},
 14770  		{"SO_NUMRCVPKT", Const, 16, ""},
 14771  		{"SO_NWRITE", Const, 0, ""},
 14772  		{"SO_OOBINLINE", Const, 0, ""},
 14773  		{"SO_OVERFLOWED", Const, 1, ""},
 14774  		{"SO_PASSCRED", Const, 0, ""},
 14775  		{"SO_PASSSEC", Const, 0, ""},
 14776  		{"SO_PEERCRED", Const, 0, ""},
 14777  		{"SO_PEERLABEL", Const, 0, ""},
 14778  		{"SO_PEERNAME", Const, 0, ""},
 14779  		{"SO_PEERSEC", Const, 0, ""},
 14780  		{"SO_PRIORITY", Const, 0, ""},
 14781  		{"SO_PROTOCOL", Const, 0, ""},
 14782  		{"SO_PROTOTYPE", Const, 1, ""},
 14783  		{"SO_RANDOMPORT", Const, 0, ""},
 14784  		{"SO_RCVBUF", Const, 0, ""},
 14785  		{"SO_RCVBUFFORCE", Const, 0, ""},
 14786  		{"SO_RCVLOWAT", Const, 0, ""},
 14787  		{"SO_RCVTIMEO", Const, 0, ""},
 14788  		{"SO_RESTRICTIONS", Const, 0, ""},
 14789  		{"SO_RESTRICT_DENYIN", Const, 0, ""},
 14790  		{"SO_RESTRICT_DENYOUT", Const, 0, ""},
 14791  		{"SO_RESTRICT_DENYSET", Const, 0, ""},
 14792  		{"SO_REUSEADDR", Const, 0, ""},
 14793  		{"SO_REUSEPORT", Const, 0, ""},
 14794  		{"SO_REUSESHAREUID", Const, 0, ""},
 14795  		{"SO_RTABLE", Const, 1, ""},
 14796  		{"SO_RXQ_OVFL", Const, 0, ""},
 14797  		{"SO_SECURITY_AUTHENTICATION", Const, 0, ""},
 14798  		{"SO_SECURITY_ENCRYPTION_NETWORK", Const, 0, ""},
 14799  		{"SO_SECURITY_ENCRYPTION_TRANSPORT", Const, 0, ""},
 14800  		{"SO_SETFIB", Const, 0, ""},
 14801  		{"SO_SNDBUF", Const, 0, ""},
 14802  		{"SO_SNDBUFFORCE", Const, 0, ""},
 14803  		{"SO_SNDLOWAT", Const, 0, ""},
 14804  		{"SO_SNDTIMEO", Const, 0, ""},
 14805  		{"SO_SPLICE", Const, 1, ""},
 14806  		{"SO_TIMESTAMP", Const, 0, ""},
 14807  		{"SO_TIMESTAMPING", Const, 0, ""},
 14808  		{"SO_TIMESTAMPNS", Const, 0, ""},
 14809  		{"SO_TIMESTAMP_MONOTONIC", Const, 0, ""},
 14810  		{"SO_TYPE", Const, 0, ""},
 14811  		{"SO_UPCALLCLOSEWAIT", Const, 0, ""},
 14812  		{"SO_UPDATE_ACCEPT_CONTEXT", Const, 0, ""},
 14813  		{"SO_UPDATE_CONNECT_CONTEXT", Const, 1, ""},
 14814  		{"SO_USELOOPBACK", Const, 0, ""},
 14815  		{"SO_USER_COOKIE", Const, 1, ""},
 14816  		{"SO_VENDOR", Const, 3, ""},
 14817  		{"SO_WANTMORE", Const, 0, ""},
 14818  		{"SO_WANTOOBFLAG", Const, 0, ""},
 14819  		{"SSLExtraCertChainPolicyPara", Type, 0, ""},
 14820  		{"SSLExtraCertChainPolicyPara.AuthType", Field, 0, ""},
 14821  		{"SSLExtraCertChainPolicyPara.Checks", Field, 0, ""},
 14822  		{"SSLExtraCertChainPolicyPara.ServerName", Field, 0, ""},
 14823  		{"SSLExtraCertChainPolicyPara.Size", Field, 0, ""},
 14824  		{"STANDARD_RIGHTS_ALL", Const, 0, ""},
 14825  		{"STANDARD_RIGHTS_EXECUTE", Const, 0, ""},
 14826  		{"STANDARD_RIGHTS_READ", Const, 0, ""},
 14827  		{"STANDARD_RIGHTS_REQUIRED", Const, 0, ""},
 14828  		{"STANDARD_RIGHTS_WRITE", Const, 0, ""},
 14829  		{"STARTF_USESHOWWINDOW", Const, 0, ""},
 14830  		{"STARTF_USESTDHANDLES", Const, 0, ""},
 14831  		{"STD_ERROR_HANDLE", Const, 0, ""},
 14832  		{"STD_INPUT_HANDLE", Const, 0, ""},
 14833  		{"STD_OUTPUT_HANDLE", Const, 0, ""},
 14834  		{"SUBLANG_ENGLISH_US", Const, 0, ""},
 14835  		{"SW_FORCEMINIMIZE", Const, 0, ""},
 14836  		{"SW_HIDE", Const, 0, ""},
 14837  		{"SW_MAXIMIZE", Const, 0, ""},
 14838  		{"SW_MINIMIZE", Const, 0, ""},
 14839  		{"SW_NORMAL", Const, 0, ""},
 14840  		{"SW_RESTORE", Const, 0, ""},
 14841  		{"SW_SHOW", Const, 0, ""},
 14842  		{"SW_SHOWDEFAULT", Const, 0, ""},
 14843  		{"SW_SHOWMAXIMIZED", Const, 0, ""},
 14844  		{"SW_SHOWMINIMIZED", Const, 0, ""},
 14845  		{"SW_SHOWMINNOACTIVE", Const, 0, ""},
 14846  		{"SW_SHOWNA", Const, 0, ""},
 14847  		{"SW_SHOWNOACTIVATE", Const, 0, ""},
 14848  		{"SW_SHOWNORMAL", Const, 0, ""},
 14849  		{"SYMBOLIC_LINK_FLAG_DIRECTORY", Const, 4, ""},
 14850  		{"SYNCHRONIZE", Const, 0, ""},
 14851  		{"SYSCTL_VERSION", Const, 1, ""},
 14852  		{"SYSCTL_VERS_0", Const, 1, ""},
 14853  		{"SYSCTL_VERS_1", Const, 1, ""},
 14854  		{"SYSCTL_VERS_MASK", Const, 1, ""},
 14855  		{"SYS_ABORT2", Const, 0, ""},
 14856  		{"SYS_ACCEPT", Const, 0, ""},
 14857  		{"SYS_ACCEPT4", Const, 0, ""},
 14858  		{"SYS_ACCEPT_NOCANCEL", Const, 0, ""},
 14859  		{"SYS_ACCESS", Const, 0, ""},
 14860  		{"SYS_ACCESS_EXTENDED", Const, 0, ""},
 14861  		{"SYS_ACCT", Const, 0, ""},
 14862  		{"SYS_ADD_KEY", Const, 0, ""},
 14863  		{"SYS_ADD_PROFIL", Const, 0, ""},
 14864  		{"SYS_ADJFREQ", Const, 1, ""},
 14865  		{"SYS_ADJTIME", Const, 0, ""},
 14866  		{"SYS_ADJTIMEX", Const, 0, ""},
 14867  		{"SYS_AFS_SYSCALL", Const, 0, ""},
 14868  		{"SYS_AIO_CANCEL", Const, 0, ""},
 14869  		{"SYS_AIO_ERROR", Const, 0, ""},
 14870  		{"SYS_AIO_FSYNC", Const, 0, ""},
 14871  		{"SYS_AIO_MLOCK", Const, 14, ""},
 14872  		{"SYS_AIO_READ", Const, 0, ""},
 14873  		{"SYS_AIO_RETURN", Const, 0, ""},
 14874  		{"SYS_AIO_SUSPEND", Const, 0, ""},
 14875  		{"SYS_AIO_SUSPEND_NOCANCEL", Const, 0, ""},
 14876  		{"SYS_AIO_WAITCOMPLETE", Const, 14, ""},
 14877  		{"SYS_AIO_WRITE", Const, 0, ""},
 14878  		{"SYS_ALARM", Const, 0, ""},
 14879  		{"SYS_ARCH_PRCTL", Const, 0, ""},
 14880  		{"SYS_ARM_FADVISE64_64", Const, 0, ""},
 14881  		{"SYS_ARM_SYNC_FILE_RANGE", Const, 0, ""},
 14882  		{"SYS_ATGETMSG", Const, 0, ""},
 14883  		{"SYS_ATPGETREQ", Const, 0, ""},
 14884  		{"SYS_ATPGETRSP", Const, 0, ""},
 14885  		{"SYS_ATPSNDREQ", Const, 0, ""},
 14886  		{"SYS_ATPSNDRSP", Const, 0, ""},
 14887  		{"SYS_ATPUTMSG", Const, 0, ""},
 14888  		{"SYS_ATSOCKET", Const, 0, ""},
 14889  		{"SYS_AUDIT", Const, 0, ""},
 14890  		{"SYS_AUDITCTL", Const, 0, ""},
 14891  		{"SYS_AUDITON", Const, 0, ""},
 14892  		{"SYS_AUDIT_SESSION_JOIN", Const, 0, ""},
 14893  		{"SYS_AUDIT_SESSION_PORT", Const, 0, ""},
 14894  		{"SYS_AUDIT_SESSION_SELF", Const, 0, ""},
 14895  		{"SYS_BDFLUSH", Const, 0, ""},
 14896  		{"SYS_BIND", Const, 0, ""},
 14897  		{"SYS_BINDAT", Const, 3, ""},
 14898  		{"SYS_BREAK", Const, 0, ""},
 14899  		{"SYS_BRK", Const, 0, ""},
 14900  		{"SYS_BSDTHREAD_CREATE", Const, 0, ""},
 14901  		{"SYS_BSDTHREAD_REGISTER", Const, 0, ""},
 14902  		{"SYS_BSDTHREAD_TERMINATE", Const, 0, ""},
 14903  		{"SYS_CAPGET", Const, 0, ""},
 14904  		{"SYS_CAPSET", Const, 0, ""},
 14905  		{"SYS_CAP_ENTER", Const, 0, ""},
 14906  		{"SYS_CAP_FCNTLS_GET", Const, 1, ""},
 14907  		{"SYS_CAP_FCNTLS_LIMIT", Const, 1, ""},
 14908  		{"SYS_CAP_GETMODE", Const, 0, ""},
 14909  		{"SYS_CAP_GETRIGHTS", Const, 0, ""},
 14910  		{"SYS_CAP_IOCTLS_GET", Const, 1, ""},
 14911  		{"SYS_CAP_IOCTLS_LIMIT", Const, 1, ""},
 14912  		{"SYS_CAP_NEW", Const, 0, ""},
 14913  		{"SYS_CAP_RIGHTS_GET", Const, 1, ""},
 14914  		{"SYS_CAP_RIGHTS_LIMIT", Const, 1, ""},
 14915  		{"SYS_CHDIR", Const, 0, ""},
 14916  		{"SYS_CHFLAGS", Const, 0, ""},
 14917  		{"SYS_CHFLAGSAT", Const, 3, ""},
 14918  		{"SYS_CHMOD", Const, 0, ""},
 14919  		{"SYS_CHMOD_EXTENDED", Const, 0, ""},
 14920  		{"SYS_CHOWN", Const, 0, ""},
 14921  		{"SYS_CHOWN32", Const, 0, ""},
 14922  		{"SYS_CHROOT", Const, 0, ""},
 14923  		{"SYS_CHUD", Const, 0, ""},
 14924  		{"SYS_CLOCK_ADJTIME", Const, 0, ""},
 14925  		{"SYS_CLOCK_GETCPUCLOCKID2", Const, 1, ""},
 14926  		{"SYS_CLOCK_GETRES", Const, 0, ""},
 14927  		{"SYS_CLOCK_GETTIME", Const, 0, ""},
 14928  		{"SYS_CLOCK_NANOSLEEP", Const, 0, ""},
 14929  		{"SYS_CLOCK_SETTIME", Const, 0, ""},
 14930  		{"SYS_CLONE", Const, 0, ""},
 14931  		{"SYS_CLOSE", Const, 0, ""},
 14932  		{"SYS_CLOSEFROM", Const, 0, ""},
 14933  		{"SYS_CLOSE_NOCANCEL", Const, 0, ""},
 14934  		{"SYS_CONNECT", Const, 0, ""},
 14935  		{"SYS_CONNECTAT", Const, 3, ""},
 14936  		{"SYS_CONNECT_NOCANCEL", Const, 0, ""},
 14937  		{"SYS_COPYFILE", Const, 0, ""},
 14938  		{"SYS_CPUSET", Const, 0, ""},
 14939  		{"SYS_CPUSET_GETAFFINITY", Const, 0, ""},
 14940  		{"SYS_CPUSET_GETID", Const, 0, ""},
 14941  		{"SYS_CPUSET_SETAFFINITY", Const, 0, ""},
 14942  		{"SYS_CPUSET_SETID", Const, 0, ""},
 14943  		{"SYS_CREAT", Const, 0, ""},
 14944  		{"SYS_CREATE_MODULE", Const, 0, ""},
 14945  		{"SYS_CSOPS", Const, 0, ""},
 14946  		{"SYS_CSOPS_AUDITTOKEN", Const, 16, ""},
 14947  		{"SYS_DELETE", Const, 0, ""},
 14948  		{"SYS_DELETE_MODULE", Const, 0, ""},
 14949  		{"SYS_DUP", Const, 0, ""},
 14950  		{"SYS_DUP2", Const, 0, ""},
 14951  		{"SYS_DUP3", Const, 0, ""},
 14952  		{"SYS_EACCESS", Const, 0, ""},
 14953  		{"SYS_EPOLL_CREATE", Const, 0, ""},
 14954  		{"SYS_EPOLL_CREATE1", Const, 0, ""},
 14955  		{"SYS_EPOLL_CTL", Const, 0, ""},
 14956  		{"SYS_EPOLL_CTL_OLD", Const, 0, ""},
 14957  		{"SYS_EPOLL_PWAIT", Const, 0, ""},
 14958  		{"SYS_EPOLL_WAIT", Const, 0, ""},
 14959  		{"SYS_EPOLL_WAIT_OLD", Const, 0, ""},
 14960  		{"SYS_EVENTFD", Const, 0, ""},
 14961  		{"SYS_EVENTFD2", Const, 0, ""},
 14962  		{"SYS_EXCHANGEDATA", Const, 0, ""},
 14963  		{"SYS_EXECVE", Const, 0, ""},
 14964  		{"SYS_EXIT", Const, 0, ""},
 14965  		{"SYS_EXIT_GROUP", Const, 0, ""},
 14966  		{"SYS_EXTATTRCTL", Const, 0, ""},
 14967  		{"SYS_EXTATTR_DELETE_FD", Const, 0, ""},
 14968  		{"SYS_EXTATTR_DELETE_FILE", Const, 0, ""},
 14969  		{"SYS_EXTATTR_DELETE_LINK", Const, 0, ""},
 14970  		{"SYS_EXTATTR_GET_FD", Const, 0, ""},
 14971  		{"SYS_EXTATTR_GET_FILE", Const, 0, ""},
 14972  		{"SYS_EXTATTR_GET_LINK", Const, 0, ""},
 14973  		{"SYS_EXTATTR_LIST_FD", Const, 0, ""},
 14974  		{"SYS_EXTATTR_LIST_FILE", Const, 0, ""},
 14975  		{"SYS_EXTATTR_LIST_LINK", Const, 0, ""},
 14976  		{"SYS_EXTATTR_SET_FD", Const, 0, ""},
 14977  		{"SYS_EXTATTR_SET_FILE", Const, 0, ""},
 14978  		{"SYS_EXTATTR_SET_LINK", Const, 0, ""},
 14979  		{"SYS_FACCESSAT", Const, 0, ""},
 14980  		{"SYS_FADVISE64", Const, 0, ""},
 14981  		{"SYS_FADVISE64_64", Const, 0, ""},
 14982  		{"SYS_FALLOCATE", Const, 0, ""},
 14983  		{"SYS_FANOTIFY_INIT", Const, 0, ""},
 14984  		{"SYS_FANOTIFY_MARK", Const, 0, ""},
 14985  		{"SYS_FCHDIR", Const, 0, ""},
 14986  		{"SYS_FCHFLAGS", Const, 0, ""},
 14987  		{"SYS_FCHMOD", Const, 0, ""},
 14988  		{"SYS_FCHMODAT", Const, 0, ""},
 14989  		{"SYS_FCHMOD_EXTENDED", Const, 0, ""},
 14990  		{"SYS_FCHOWN", Const, 0, ""},
 14991  		{"SYS_FCHOWN32", Const, 0, ""},
 14992  		{"SYS_FCHOWNAT", Const, 0, ""},
 14993  		{"SYS_FCHROOT", Const, 1, ""},
 14994  		{"SYS_FCNTL", Const, 0, ""},
 14995  		{"SYS_FCNTL64", Const, 0, ""},
 14996  		{"SYS_FCNTL_NOCANCEL", Const, 0, ""},
 14997  		{"SYS_FDATASYNC", Const, 0, ""},
 14998  		{"SYS_FEXECVE", Const, 0, ""},
 14999  		{"SYS_FFCLOCK_GETCOUNTER", Const, 0, ""},
 15000  		{"SYS_FFCLOCK_GETESTIMATE", Const, 0, ""},
 15001  		{"SYS_FFCLOCK_SETESTIMATE", Const, 0, ""},
 15002  		{"SYS_FFSCTL", Const, 0, ""},
 15003  		{"SYS_FGETATTRLIST", Const, 0, ""},
 15004  		{"SYS_FGETXATTR", Const, 0, ""},
 15005  		{"SYS_FHOPEN", Const, 0, ""},
 15006  		{"SYS_FHSTAT", Const, 0, ""},
 15007  		{"SYS_FHSTATFS", Const, 0, ""},
 15008  		{"SYS_FILEPORT_MAKEFD", Const, 0, ""},
 15009  		{"SYS_FILEPORT_MAKEPORT", Const, 0, ""},
 15010  		{"SYS_FKTRACE", Const, 1, ""},
 15011  		{"SYS_FLISTXATTR", Const, 0, ""},
 15012  		{"SYS_FLOCK", Const, 0, ""},
 15013  		{"SYS_FORK", Const, 0, ""},
 15014  		{"SYS_FPATHCONF", Const, 0, ""},
 15015  		{"SYS_FREEBSD6_FTRUNCATE", Const, 0, ""},
 15016  		{"SYS_FREEBSD6_LSEEK", Const, 0, ""},
 15017  		{"SYS_FREEBSD6_MMAP", Const, 0, ""},
 15018  		{"SYS_FREEBSD6_PREAD", Const, 0, ""},
 15019  		{"SYS_FREEBSD6_PWRITE", Const, 0, ""},
 15020  		{"SYS_FREEBSD6_TRUNCATE", Const, 0, ""},
 15021  		{"SYS_FREMOVEXATTR", Const, 0, ""},
 15022  		{"SYS_FSCTL", Const, 0, ""},
 15023  		{"SYS_FSETATTRLIST", Const, 0, ""},
 15024  		{"SYS_FSETXATTR", Const, 0, ""},
 15025  		{"SYS_FSGETPATH", Const, 0, ""},
 15026  		{"SYS_FSTAT", Const, 0, ""},
 15027  		{"SYS_FSTAT64", Const, 0, ""},
 15028  		{"SYS_FSTAT64_EXTENDED", Const, 0, ""},
 15029  		{"SYS_FSTATAT", Const, 0, ""},
 15030  		{"SYS_FSTATAT64", Const, 0, ""},
 15031  		{"SYS_FSTATFS", Const, 0, ""},
 15032  		{"SYS_FSTATFS64", Const, 0, ""},
 15033  		{"SYS_FSTATV", Const, 0, ""},
 15034  		{"SYS_FSTATVFS1", Const, 1, ""},
 15035  		{"SYS_FSTAT_EXTENDED", Const, 0, ""},
 15036  		{"SYS_FSYNC", Const, 0, ""},
 15037  		{"SYS_FSYNC_NOCANCEL", Const, 0, ""},
 15038  		{"SYS_FSYNC_RANGE", Const, 1, ""},
 15039  		{"SYS_FTIME", Const, 0, ""},
 15040  		{"SYS_FTRUNCATE", Const, 0, ""},
 15041  		{"SYS_FTRUNCATE64", Const, 0, ""},
 15042  		{"SYS_FUTEX", Const, 0, ""},
 15043  		{"SYS_FUTIMENS", Const, 1, ""},
 15044  		{"SYS_FUTIMES", Const, 0, ""},
 15045  		{"SYS_FUTIMESAT", Const, 0, ""},
 15046  		{"SYS_GETATTRLIST", Const, 0, ""},
 15047  		{"SYS_GETAUDIT", Const, 0, ""},
 15048  		{"SYS_GETAUDIT_ADDR", Const, 0, ""},
 15049  		{"SYS_GETAUID", Const, 0, ""},
 15050  		{"SYS_GETCONTEXT", Const, 0, ""},
 15051  		{"SYS_GETCPU", Const, 0, ""},
 15052  		{"SYS_GETCWD", Const, 0, ""},
 15053  		{"SYS_GETDENTS", Const, 0, ""},
 15054  		{"SYS_GETDENTS64", Const, 0, ""},
 15055  		{"SYS_GETDIRENTRIES", Const, 0, ""},
 15056  		{"SYS_GETDIRENTRIES64", Const, 0, ""},
 15057  		{"SYS_GETDIRENTRIESATTR", Const, 0, ""},
 15058  		{"SYS_GETDTABLECOUNT", Const, 1, ""},
 15059  		{"SYS_GETDTABLESIZE", Const, 0, ""},
 15060  		{"SYS_GETEGID", Const, 0, ""},
 15061  		{"SYS_GETEGID32", Const, 0, ""},
 15062  		{"SYS_GETEUID", Const, 0, ""},
 15063  		{"SYS_GETEUID32", Const, 0, ""},
 15064  		{"SYS_GETFH", Const, 0, ""},
 15065  		{"SYS_GETFSSTAT", Const, 0, ""},
 15066  		{"SYS_GETFSSTAT64", Const, 0, ""},
 15067  		{"SYS_GETGID", Const, 0, ""},
 15068  		{"SYS_GETGID32", Const, 0, ""},
 15069  		{"SYS_GETGROUPS", Const, 0, ""},
 15070  		{"SYS_GETGROUPS32", Const, 0, ""},
 15071  		{"SYS_GETHOSTUUID", Const, 0, ""},
 15072  		{"SYS_GETITIMER", Const, 0, ""},
 15073  		{"SYS_GETLCID", Const, 0, ""},
 15074  		{"SYS_GETLOGIN", Const, 0, ""},
 15075  		{"SYS_GETLOGINCLASS", Const, 0, ""},
 15076  		{"SYS_GETPEERNAME", Const, 0, ""},
 15077  		{"SYS_GETPGID", Const, 0, ""},
 15078  		{"SYS_GETPGRP", Const, 0, ""},
 15079  		{"SYS_GETPID", Const, 0, ""},
 15080  		{"SYS_GETPMSG", Const, 0, ""},
 15081  		{"SYS_GETPPID", Const, 0, ""},
 15082  		{"SYS_GETPRIORITY", Const, 0, ""},
 15083  		{"SYS_GETRESGID", Const, 0, ""},
 15084  		{"SYS_GETRESGID32", Const, 0, ""},
 15085  		{"SYS_GETRESUID", Const, 0, ""},
 15086  		{"SYS_GETRESUID32", Const, 0, ""},
 15087  		{"SYS_GETRLIMIT", Const, 0, ""},
 15088  		{"SYS_GETRTABLE", Const, 1, ""},
 15089  		{"SYS_GETRUSAGE", Const, 0, ""},
 15090  		{"SYS_GETSGROUPS", Const, 0, ""},
 15091  		{"SYS_GETSID", Const, 0, ""},
 15092  		{"SYS_GETSOCKNAME", Const, 0, ""},
 15093  		{"SYS_GETSOCKOPT", Const, 0, ""},
 15094  		{"SYS_GETTHRID", Const, 1, ""},
 15095  		{"SYS_GETTID", Const, 0, ""},
 15096  		{"SYS_GETTIMEOFDAY", Const, 0, ""},
 15097  		{"SYS_GETUID", Const, 0, ""},
 15098  		{"SYS_GETUID32", Const, 0, ""},
 15099  		{"SYS_GETVFSSTAT", Const, 1, ""},
 15100  		{"SYS_GETWGROUPS", Const, 0, ""},
 15101  		{"SYS_GETXATTR", Const, 0, ""},
 15102  		{"SYS_GET_KERNEL_SYMS", Const, 0, ""},
 15103  		{"SYS_GET_MEMPOLICY", Const, 0, ""},
 15104  		{"SYS_GET_ROBUST_LIST", Const, 0, ""},
 15105  		{"SYS_GET_THREAD_AREA", Const, 0, ""},
 15106  		{"SYS_GSSD_SYSCALL", Const, 14, ""},
 15107  		{"SYS_GTTY", Const, 0, ""},
 15108  		{"SYS_IDENTITYSVC", Const, 0, ""},
 15109  		{"SYS_IDLE", Const, 0, ""},
 15110  		{"SYS_INITGROUPS", Const, 0, ""},
 15111  		{"SYS_INIT_MODULE", Const, 0, ""},
 15112  		{"SYS_INOTIFY_ADD_WATCH", Const, 0, ""},
 15113  		{"SYS_INOTIFY_INIT", Const, 0, ""},
 15114  		{"SYS_INOTIFY_INIT1", Const, 0, ""},
 15115  		{"SYS_INOTIFY_RM_WATCH", Const, 0, ""},
 15116  		{"SYS_IOCTL", Const, 0, ""},
 15117  		{"SYS_IOPERM", Const, 0, ""},
 15118  		{"SYS_IOPL", Const, 0, ""},
 15119  		{"SYS_IOPOLICYSYS", Const, 0, ""},
 15120  		{"SYS_IOPRIO_GET", Const, 0, ""},
 15121  		{"SYS_IOPRIO_SET", Const, 0, ""},
 15122  		{"SYS_IO_CANCEL", Const, 0, ""},
 15123  		{"SYS_IO_DESTROY", Const, 0, ""},
 15124  		{"SYS_IO_GETEVENTS", Const, 0, ""},
 15125  		{"SYS_IO_SETUP", Const, 0, ""},
 15126  		{"SYS_IO_SUBMIT", Const, 0, ""},
 15127  		{"SYS_IPC", Const, 0, ""},
 15128  		{"SYS_ISSETUGID", Const, 0, ""},
 15129  		{"SYS_JAIL", Const, 0, ""},
 15130  		{"SYS_JAIL_ATTACH", Const, 0, ""},
 15131  		{"SYS_JAIL_GET", Const, 0, ""},
 15132  		{"SYS_JAIL_REMOVE", Const, 0, ""},
 15133  		{"SYS_JAIL_SET", Const, 0, ""},
 15134  		{"SYS_KAS_INFO", Const, 16, ""},
 15135  		{"SYS_KDEBUG_TRACE", Const, 0, ""},
 15136  		{"SYS_KENV", Const, 0, ""},
 15137  		{"SYS_KEVENT", Const, 0, ""},
 15138  		{"SYS_KEVENT64", Const, 0, ""},
 15139  		{"SYS_KEXEC_LOAD", Const, 0, ""},
 15140  		{"SYS_KEYCTL", Const, 0, ""},
 15141  		{"SYS_KILL", Const, 0, ""},
 15142  		{"SYS_KLDFIND", Const, 0, ""},
 15143  		{"SYS_KLDFIRSTMOD", Const, 0, ""},
 15144  		{"SYS_KLDLOAD", Const, 0, ""},
 15145  		{"SYS_KLDNEXT", Const, 0, ""},
 15146  		{"SYS_KLDSTAT", Const, 0, ""},
 15147  		{"SYS_KLDSYM", Const, 0, ""},
 15148  		{"SYS_KLDUNLOAD", Const, 0, ""},
 15149  		{"SYS_KLDUNLOADF", Const, 0, ""},
 15150  		{"SYS_KMQ_NOTIFY", Const, 14, ""},
 15151  		{"SYS_KMQ_OPEN", Const, 14, ""},
 15152  		{"SYS_KMQ_SETATTR", Const, 14, ""},
 15153  		{"SYS_KMQ_TIMEDRECEIVE", Const, 14, ""},
 15154  		{"SYS_KMQ_TIMEDSEND", Const, 14, ""},
 15155  		{"SYS_KMQ_UNLINK", Const, 14, ""},
 15156  		{"SYS_KQUEUE", Const, 0, ""},
 15157  		{"SYS_KQUEUE1", Const, 1, ""},
 15158  		{"SYS_KSEM_CLOSE", Const, 14, ""},
 15159  		{"SYS_KSEM_DESTROY", Const, 14, ""},
 15160  		{"SYS_KSEM_GETVALUE", Const, 14, ""},
 15161  		{"SYS_KSEM_INIT", Const, 14, ""},
 15162  		{"SYS_KSEM_OPEN", Const, 14, ""},
 15163  		{"SYS_KSEM_POST", Const, 14, ""},
 15164  		{"SYS_KSEM_TIMEDWAIT", Const, 14, ""},
 15165  		{"SYS_KSEM_TRYWAIT", Const, 14, ""},
 15166  		{"SYS_KSEM_UNLINK", Const, 14, ""},
 15167  		{"SYS_KSEM_WAIT", Const, 14, ""},
 15168  		{"SYS_KTIMER_CREATE", Const, 0, ""},
 15169  		{"SYS_KTIMER_DELETE", Const, 0, ""},
 15170  		{"SYS_KTIMER_GETOVERRUN", Const, 0, ""},
 15171  		{"SYS_KTIMER_GETTIME", Const, 0, ""},
 15172  		{"SYS_KTIMER_SETTIME", Const, 0, ""},
 15173  		{"SYS_KTRACE", Const, 0, ""},
 15174  		{"SYS_LCHFLAGS", Const, 0, ""},
 15175  		{"SYS_LCHMOD", Const, 0, ""},
 15176  		{"SYS_LCHOWN", Const, 0, ""},
 15177  		{"SYS_LCHOWN32", Const, 0, ""},
 15178  		{"SYS_LEDGER", Const, 16, ""},
 15179  		{"SYS_LGETFH", Const, 0, ""},
 15180  		{"SYS_LGETXATTR", Const, 0, ""},
 15181  		{"SYS_LINK", Const, 0, ""},
 15182  		{"SYS_LINKAT", Const, 0, ""},
 15183  		{"SYS_LIO_LISTIO", Const, 0, ""},
 15184  		{"SYS_LISTEN", Const, 0, ""},
 15185  		{"SYS_LISTXATTR", Const, 0, ""},
 15186  		{"SYS_LLISTXATTR", Const, 0, ""},
 15187  		{"SYS_LOCK", Const, 0, ""},
 15188  		{"SYS_LOOKUP_DCOOKIE", Const, 0, ""},
 15189  		{"SYS_LPATHCONF", Const, 0, ""},
 15190  		{"SYS_LREMOVEXATTR", Const, 0, ""},
 15191  		{"SYS_LSEEK", Const, 0, ""},
 15192  		{"SYS_LSETXATTR", Const, 0, ""},
 15193  		{"SYS_LSTAT", Const, 0, ""},
 15194  		{"SYS_LSTAT64", Const, 0, ""},
 15195  		{"SYS_LSTAT64_EXTENDED", Const, 0, ""},
 15196  		{"SYS_LSTATV", Const, 0, ""},
 15197  		{"SYS_LSTAT_EXTENDED", Const, 0, ""},
 15198  		{"SYS_LUTIMES", Const, 0, ""},
 15199  		{"SYS_MAC_SYSCALL", Const, 0, ""},
 15200  		{"SYS_MADVISE", Const, 0, ""},
 15201  		{"SYS_MADVISE1", Const, 0, ""},
 15202  		{"SYS_MAXSYSCALL", Const, 0, ""},
 15203  		{"SYS_MBIND", Const, 0, ""},
 15204  		{"SYS_MIGRATE_PAGES", Const, 0, ""},
 15205  		{"SYS_MINCORE", Const, 0, ""},
 15206  		{"SYS_MINHERIT", Const, 0, ""},
 15207  		{"SYS_MKCOMPLEX", Const, 0, ""},
 15208  		{"SYS_MKDIR", Const, 0, ""},
 15209  		{"SYS_MKDIRAT", Const, 0, ""},
 15210  		{"SYS_MKDIR_EXTENDED", Const, 0, ""},
 15211  		{"SYS_MKFIFO", Const, 0, ""},
 15212  		{"SYS_MKFIFOAT", Const, 0, ""},
 15213  		{"SYS_MKFIFO_EXTENDED", Const, 0, ""},
 15214  		{"SYS_MKNOD", Const, 0, ""},
 15215  		{"SYS_MKNODAT", Const, 0, ""},
 15216  		{"SYS_MLOCK", Const, 0, ""},
 15217  		{"SYS_MLOCKALL", Const, 0, ""},
 15218  		{"SYS_MMAP", Const, 0, ""},
 15219  		{"SYS_MMAP2", Const, 0, ""},
 15220  		{"SYS_MODCTL", Const, 1, ""},
 15221  		{"SYS_MODFIND", Const, 0, ""},
 15222  		{"SYS_MODFNEXT", Const, 0, ""},
 15223  		{"SYS_MODIFY_LDT", Const, 0, ""},
 15224  		{"SYS_MODNEXT", Const, 0, ""},
 15225  		{"SYS_MODSTAT", Const, 0, ""},
 15226  		{"SYS_MODWATCH", Const, 0, ""},
 15227  		{"SYS_MOUNT", Const, 0, ""},
 15228  		{"SYS_MOVE_PAGES", Const, 0, ""},
 15229  		{"SYS_MPROTECT", Const, 0, ""},
 15230  		{"SYS_MPX", Const, 0, ""},
 15231  		{"SYS_MQUERY", Const, 1, ""},
 15232  		{"SYS_MQ_GETSETATTR", Const, 0, ""},
 15233  		{"SYS_MQ_NOTIFY", Const, 0, ""},
 15234  		{"SYS_MQ_OPEN", Const, 0, ""},
 15235  		{"SYS_MQ_TIMEDRECEIVE", Const, 0, ""},
 15236  		{"SYS_MQ_TIMEDSEND", Const, 0, ""},
 15237  		{"SYS_MQ_UNLINK", Const, 0, ""},
 15238  		{"SYS_MREMAP", Const, 0, ""},
 15239  		{"SYS_MSGCTL", Const, 0, ""},
 15240  		{"SYS_MSGGET", Const, 0, ""},
 15241  		{"SYS_MSGRCV", Const, 0, ""},
 15242  		{"SYS_MSGRCV_NOCANCEL", Const, 0, ""},
 15243  		{"SYS_MSGSND", Const, 0, ""},
 15244  		{"SYS_MSGSND_NOCANCEL", Const, 0, ""},
 15245  		{"SYS_MSGSYS", Const, 0, ""},
 15246  		{"SYS_MSYNC", Const, 0, ""},
 15247  		{"SYS_MSYNC_NOCANCEL", Const, 0, ""},
 15248  		{"SYS_MUNLOCK", Const, 0, ""},
 15249  		{"SYS_MUNLOCKALL", Const, 0, ""},
 15250  		{"SYS_MUNMAP", Const, 0, ""},
 15251  		{"SYS_NAME_TO_HANDLE_AT", Const, 0, ""},
 15252  		{"SYS_NANOSLEEP", Const, 0, ""},
 15253  		{"SYS_NEWFSTATAT", Const, 0, ""},
 15254  		{"SYS_NFSCLNT", Const, 0, ""},
 15255  		{"SYS_NFSSERVCTL", Const, 0, ""},
 15256  		{"SYS_NFSSVC", Const, 0, ""},
 15257  		{"SYS_NFSTAT", Const, 0, ""},
 15258  		{"SYS_NICE", Const, 0, ""},
 15259  		{"SYS_NLM_SYSCALL", Const, 14, ""},
 15260  		{"SYS_NLSTAT", Const, 0, ""},
 15261  		{"SYS_NMOUNT", Const, 0, ""},
 15262  		{"SYS_NSTAT", Const, 0, ""},
 15263  		{"SYS_NTP_ADJTIME", Const, 0, ""},
 15264  		{"SYS_NTP_GETTIME", Const, 0, ""},
 15265  		{"SYS_NUMA_GETAFFINITY", Const, 14, ""},
 15266  		{"SYS_NUMA_SETAFFINITY", Const, 14, ""},
 15267  		{"SYS_OABI_SYSCALL_BASE", Const, 0, ""},
 15268  		{"SYS_OBREAK", Const, 0, ""},
 15269  		{"SYS_OLDFSTAT", Const, 0, ""},
 15270  		{"SYS_OLDLSTAT", Const, 0, ""},
 15271  		{"SYS_OLDOLDUNAME", Const, 0, ""},
 15272  		{"SYS_OLDSTAT", Const, 0, ""},
 15273  		{"SYS_OLDUNAME", Const, 0, ""},
 15274  		{"SYS_OPEN", Const, 0, ""},
 15275  		{"SYS_OPENAT", Const, 0, ""},
 15276  		{"SYS_OPENBSD_POLL", Const, 0, ""},
 15277  		{"SYS_OPEN_BY_HANDLE_AT", Const, 0, ""},
 15278  		{"SYS_OPEN_DPROTECTED_NP", Const, 16, ""},
 15279  		{"SYS_OPEN_EXTENDED", Const, 0, ""},
 15280  		{"SYS_OPEN_NOCANCEL", Const, 0, ""},
 15281  		{"SYS_OVADVISE", Const, 0, ""},
 15282  		{"SYS_PACCEPT", Const, 1, ""},
 15283  		{"SYS_PATHCONF", Const, 0, ""},
 15284  		{"SYS_PAUSE", Const, 0, ""},
 15285  		{"SYS_PCICONFIG_IOBASE", Const, 0, ""},
 15286  		{"SYS_PCICONFIG_READ", Const, 0, ""},
 15287  		{"SYS_PCICONFIG_WRITE", Const, 0, ""},
 15288  		{"SYS_PDFORK", Const, 0, ""},
 15289  		{"SYS_PDGETPID", Const, 0, ""},
 15290  		{"SYS_PDKILL", Const, 0, ""},
 15291  		{"SYS_PERF_EVENT_OPEN", Const, 0, ""},
 15292  		{"SYS_PERSONALITY", Const, 0, ""},
 15293  		{"SYS_PID_HIBERNATE", Const, 0, ""},
 15294  		{"SYS_PID_RESUME", Const, 0, ""},
 15295  		{"SYS_PID_SHUTDOWN_SOCKETS", Const, 0, ""},
 15296  		{"SYS_PID_SUSPEND", Const, 0, ""},
 15297  		{"SYS_PIPE", Const, 0, ""},
 15298  		{"SYS_PIPE2", Const, 0, ""},
 15299  		{"SYS_PIVOT_ROOT", Const, 0, ""},
 15300  		{"SYS_PMC_CONTROL", Const, 1, ""},
 15301  		{"SYS_PMC_GET_INFO", Const, 1, ""},
 15302  		{"SYS_POLL", Const, 0, ""},
 15303  		{"SYS_POLLTS", Const, 1, ""},
 15304  		{"SYS_POLL_NOCANCEL", Const, 0, ""},
 15305  		{"SYS_POSIX_FADVISE", Const, 0, ""},
 15306  		{"SYS_POSIX_FALLOCATE", Const, 0, ""},
 15307  		{"SYS_POSIX_OPENPT", Const, 0, ""},
 15308  		{"SYS_POSIX_SPAWN", Const, 0, ""},
 15309  		{"SYS_PPOLL", Const, 0, ""},
 15310  		{"SYS_PRCTL", Const, 0, ""},
 15311  		{"SYS_PREAD", Const, 0, ""},
 15312  		{"SYS_PREAD64", Const, 0, ""},
 15313  		{"SYS_PREADV", Const, 0, ""},
 15314  		{"SYS_PREAD_NOCANCEL", Const, 0, ""},
 15315  		{"SYS_PRLIMIT64", Const, 0, ""},
 15316  		{"SYS_PROCCTL", Const, 3, ""},
 15317  		{"SYS_PROCESS_POLICY", Const, 0, ""},
 15318  		{"SYS_PROCESS_VM_READV", Const, 0, ""},
 15319  		{"SYS_PROCESS_VM_WRITEV", Const, 0, ""},
 15320  		{"SYS_PROC_INFO", Const, 0, ""},
 15321  		{"SYS_PROF", Const, 0, ""},
 15322  		{"SYS_PROFIL", Const, 0, ""},
 15323  		{"SYS_PSELECT", Const, 0, ""},
 15324  		{"SYS_PSELECT6", Const, 0, ""},
 15325  		{"SYS_PSET_ASSIGN", Const, 1, ""},
 15326  		{"SYS_PSET_CREATE", Const, 1, ""},
 15327  		{"SYS_PSET_DESTROY", Const, 1, ""},
 15328  		{"SYS_PSYNCH_CVBROAD", Const, 0, ""},
 15329  		{"SYS_PSYNCH_CVCLRPREPOST", Const, 0, ""},
 15330  		{"SYS_PSYNCH_CVSIGNAL", Const, 0, ""},
 15331  		{"SYS_PSYNCH_CVWAIT", Const, 0, ""},
 15332  		{"SYS_PSYNCH_MUTEXDROP", Const, 0, ""},
 15333  		{"SYS_PSYNCH_MUTEXWAIT", Const, 0, ""},
 15334  		{"SYS_PSYNCH_RW_DOWNGRADE", Const, 0, ""},
 15335  		{"SYS_PSYNCH_RW_LONGRDLOCK", Const, 0, ""},
 15336  		{"SYS_PSYNCH_RW_RDLOCK", Const, 0, ""},
 15337  		{"SYS_PSYNCH_RW_UNLOCK", Const, 0, ""},
 15338  		{"SYS_PSYNCH_RW_UNLOCK2", Const, 0, ""},
 15339  		{"SYS_PSYNCH_RW_UPGRADE", Const, 0, ""},
 15340  		{"SYS_PSYNCH_RW_WRLOCK", Const, 0, ""},
 15341  		{"SYS_PSYNCH_RW_YIELDWRLOCK", Const, 0, ""},
 15342  		{"SYS_PTRACE", Const, 0, ""},
 15343  		{"SYS_PUTPMSG", Const, 0, ""},
 15344  		{"SYS_PWRITE", Const, 0, ""},
 15345  		{"SYS_PWRITE64", Const, 0, ""},
 15346  		{"SYS_PWRITEV", Const, 0, ""},
 15347  		{"SYS_PWRITE_NOCANCEL", Const, 0, ""},
 15348  		{"SYS_QUERY_MODULE", Const, 0, ""},
 15349  		{"SYS_QUOTACTL", Const, 0, ""},
 15350  		{"SYS_RASCTL", Const, 1, ""},
 15351  		{"SYS_RCTL_ADD_RULE", Const, 0, ""},
 15352  		{"SYS_RCTL_GET_LIMITS", Const, 0, ""},
 15353  		{"SYS_RCTL_GET_RACCT", Const, 0, ""},
 15354  		{"SYS_RCTL_GET_RULES", Const, 0, ""},
 15355  		{"SYS_RCTL_REMOVE_RULE", Const, 0, ""},
 15356  		{"SYS_READ", Const, 0, ""},
 15357  		{"SYS_READAHEAD", Const, 0, ""},
 15358  		{"SYS_READDIR", Const, 0, ""},
 15359  		{"SYS_READLINK", Const, 0, ""},
 15360  		{"SYS_READLINKAT", Const, 0, ""},
 15361  		{"SYS_READV", Const, 0, ""},
 15362  		{"SYS_READV_NOCANCEL", Const, 0, ""},
 15363  		{"SYS_READ_NOCANCEL", Const, 0, ""},
 15364  		{"SYS_REBOOT", Const, 0, ""},
 15365  		{"SYS_RECV", Const, 0, ""},
 15366  		{"SYS_RECVFROM", Const, 0, ""},
 15367  		{"SYS_RECVFROM_NOCANCEL", Const, 0, ""},
 15368  		{"SYS_RECVMMSG", Const, 0, ""},
 15369  		{"SYS_RECVMSG", Const, 0, ""},
 15370  		{"SYS_RECVMSG_NOCANCEL", Const, 0, ""},
 15371  		{"SYS_REMAP_FILE_PAGES", Const, 0, ""},
 15372  		{"SYS_REMOVEXATTR", Const, 0, ""},
 15373  		{"SYS_RENAME", Const, 0, ""},
 15374  		{"SYS_RENAMEAT", Const, 0, ""},
 15375  		{"SYS_REQUEST_KEY", Const, 0, ""},
 15376  		{"SYS_RESTART_SYSCALL", Const, 0, ""},
 15377  		{"SYS_REVOKE", Const, 0, ""},
 15378  		{"SYS_RFORK", Const, 0, ""},
 15379  		{"SYS_RMDIR", Const, 0, ""},
 15380  		{"SYS_RTPRIO", Const, 0, ""},
 15381  		{"SYS_RTPRIO_THREAD", Const, 0, ""},
 15382  		{"SYS_RT_SIGACTION", Const, 0, ""},
 15383  		{"SYS_RT_SIGPENDING", Const, 0, ""},
 15384  		{"SYS_RT_SIGPROCMASK", Const, 0, ""},
 15385  		{"SYS_RT_SIGQUEUEINFO", Const, 0, ""},
 15386  		{"SYS_RT_SIGRETURN", Const, 0, ""},
 15387  		{"SYS_RT_SIGSUSPEND", Const, 0, ""},
 15388  		{"SYS_RT_SIGTIMEDWAIT", Const, 0, ""},
 15389  		{"SYS_RT_TGSIGQUEUEINFO", Const, 0, ""},
 15390  		{"SYS_SBRK", Const, 0, ""},
 15391  		{"SYS_SCHED_GETAFFINITY", Const, 0, ""},
 15392  		{"SYS_SCHED_GETPARAM", Const, 0, ""},
 15393  		{"SYS_SCHED_GETSCHEDULER", Const, 0, ""},
 15394  		{"SYS_SCHED_GET_PRIORITY_MAX", Const, 0, ""},
 15395  		{"SYS_SCHED_GET_PRIORITY_MIN", Const, 0, ""},
 15396  		{"SYS_SCHED_RR_GET_INTERVAL", Const, 0, ""},
 15397  		{"SYS_SCHED_SETAFFINITY", Const, 0, ""},
 15398  		{"SYS_SCHED_SETPARAM", Const, 0, ""},
 15399  		{"SYS_SCHED_SETSCHEDULER", Const, 0, ""},
 15400  		{"SYS_SCHED_YIELD", Const, 0, ""},
 15401  		{"SYS_SCTP_GENERIC_RECVMSG", Const, 0, ""},
 15402  		{"SYS_SCTP_GENERIC_SENDMSG", Const, 0, ""},
 15403  		{"SYS_SCTP_GENERIC_SENDMSG_IOV", Const, 0, ""},
 15404  		{"SYS_SCTP_PEELOFF", Const, 0, ""},
 15405  		{"SYS_SEARCHFS", Const, 0, ""},
 15406  		{"SYS_SECURITY", Const, 0, ""},
 15407  		{"SYS_SELECT", Const, 0, ""},
 15408  		{"SYS_SELECT_NOCANCEL", Const, 0, ""},
 15409  		{"SYS_SEMCONFIG", Const, 1, ""},
 15410  		{"SYS_SEMCTL", Const, 0, ""},
 15411  		{"SYS_SEMGET", Const, 0, ""},
 15412  		{"SYS_SEMOP", Const, 0, ""},
 15413  		{"SYS_SEMSYS", Const, 0, ""},
 15414  		{"SYS_SEMTIMEDOP", Const, 0, ""},
 15415  		{"SYS_SEM_CLOSE", Const, 0, ""},
 15416  		{"SYS_SEM_DESTROY", Const, 0, ""},
 15417  		{"SYS_SEM_GETVALUE", Const, 0, ""},
 15418  		{"SYS_SEM_INIT", Const, 0, ""},
 15419  		{"SYS_SEM_OPEN", Const, 0, ""},
 15420  		{"SYS_SEM_POST", Const, 0, ""},
 15421  		{"SYS_SEM_TRYWAIT", Const, 0, ""},
 15422  		{"SYS_SEM_UNLINK", Const, 0, ""},
 15423  		{"SYS_SEM_WAIT", Const, 0, ""},
 15424  		{"SYS_SEM_WAIT_NOCANCEL", Const, 0, ""},
 15425  		{"SYS_SEND", Const, 0, ""},
 15426  		{"SYS_SENDFILE", Const, 0, ""},
 15427  		{"SYS_SENDFILE64", Const, 0, ""},
 15428  		{"SYS_SENDMMSG", Const, 0, ""},
 15429  		{"SYS_SENDMSG", Const, 0, ""},
 15430  		{"SYS_SENDMSG_NOCANCEL", Const, 0, ""},
 15431  		{"SYS_SENDTO", Const, 0, ""},
 15432  		{"SYS_SENDTO_NOCANCEL", Const, 0, ""},
 15433  		{"SYS_SETATTRLIST", Const, 0, ""},
 15434  		{"SYS_SETAUDIT", Const, 0, ""},
 15435  		{"SYS_SETAUDIT_ADDR", Const, 0, ""},
 15436  		{"SYS_SETAUID", Const, 0, ""},
 15437  		{"SYS_SETCONTEXT", Const, 0, ""},
 15438  		{"SYS_SETDOMAINNAME", Const, 0, ""},
 15439  		{"SYS_SETEGID", Const, 0, ""},
 15440  		{"SYS_SETEUID", Const, 0, ""},
 15441  		{"SYS_SETFIB", Const, 0, ""},
 15442  		{"SYS_SETFSGID", Const, 0, ""},
 15443  		{"SYS_SETFSGID32", Const, 0, ""},
 15444  		{"SYS_SETFSUID", Const, 0, ""},
 15445  		{"SYS_SETFSUID32", Const, 0, ""},
 15446  		{"SYS_SETGID", Const, 0, ""},
 15447  		{"SYS_SETGID32", Const, 0, ""},
 15448  		{"SYS_SETGROUPS", Const, 0, ""},
 15449  		{"SYS_SETGROUPS32", Const, 0, ""},
 15450  		{"SYS_SETHOSTNAME", Const, 0, ""},
 15451  		{"SYS_SETITIMER", Const, 0, ""},
 15452  		{"SYS_SETLCID", Const, 0, ""},
 15453  		{"SYS_SETLOGIN", Const, 0, ""},
 15454  		{"SYS_SETLOGINCLASS", Const, 0, ""},
 15455  		{"SYS_SETNS", Const, 0, ""},
 15456  		{"SYS_SETPGID", Const, 0, ""},
 15457  		{"SYS_SETPRIORITY", Const, 0, ""},
 15458  		{"SYS_SETPRIVEXEC", Const, 0, ""},
 15459  		{"SYS_SETREGID", Const, 0, ""},
 15460  		{"SYS_SETREGID32", Const, 0, ""},
 15461  		{"SYS_SETRESGID", Const, 0, ""},
 15462  		{"SYS_SETRESGID32", Const, 0, ""},
 15463  		{"SYS_SETRESUID", Const, 0, ""},
 15464  		{"SYS_SETRESUID32", Const, 0, ""},
 15465  		{"SYS_SETREUID", Const, 0, ""},
 15466  		{"SYS_SETREUID32", Const, 0, ""},
 15467  		{"SYS_SETRLIMIT", Const, 0, ""},
 15468  		{"SYS_SETRTABLE", Const, 1, ""},
 15469  		{"SYS_SETSGROUPS", Const, 0, ""},
 15470  		{"SYS_SETSID", Const, 0, ""},
 15471  		{"SYS_SETSOCKOPT", Const, 0, ""},
 15472  		{"SYS_SETTID", Const, 0, ""},
 15473  		{"SYS_SETTID_WITH_PID", Const, 0, ""},
 15474  		{"SYS_SETTIMEOFDAY", Const, 0, ""},
 15475  		{"SYS_SETUID", Const, 0, ""},
 15476  		{"SYS_SETUID32", Const, 0, ""},
 15477  		{"SYS_SETWGROUPS", Const, 0, ""},
 15478  		{"SYS_SETXATTR", Const, 0, ""},
 15479  		{"SYS_SET_MEMPOLICY", Const, 0, ""},
 15480  		{"SYS_SET_ROBUST_LIST", Const, 0, ""},
 15481  		{"SYS_SET_THREAD_AREA", Const, 0, ""},
 15482  		{"SYS_SET_TID_ADDRESS", Const, 0, ""},
 15483  		{"SYS_SGETMASK", Const, 0, ""},
 15484  		{"SYS_SHARED_REGION_CHECK_NP", Const, 0, ""},
 15485  		{"SYS_SHARED_REGION_MAP_AND_SLIDE_NP", Const, 0, ""},
 15486  		{"SYS_SHMAT", Const, 0, ""},
 15487  		{"SYS_SHMCTL", Const, 0, ""},
 15488  		{"SYS_SHMDT", Const, 0, ""},
 15489  		{"SYS_SHMGET", Const, 0, ""},
 15490  		{"SYS_SHMSYS", Const, 0, ""},
 15491  		{"SYS_SHM_OPEN", Const, 0, ""},
 15492  		{"SYS_SHM_UNLINK", Const, 0, ""},
 15493  		{"SYS_SHUTDOWN", Const, 0, ""},
 15494  		{"SYS_SIGACTION", Const, 0, ""},
 15495  		{"SYS_SIGALTSTACK", Const, 0, ""},
 15496  		{"SYS_SIGNAL", Const, 0, ""},
 15497  		{"SYS_SIGNALFD", Const, 0, ""},
 15498  		{"SYS_SIGNALFD4", Const, 0, ""},
 15499  		{"SYS_SIGPENDING", Const, 0, ""},
 15500  		{"SYS_SIGPROCMASK", Const, 0, ""},
 15501  		{"SYS_SIGQUEUE", Const, 0, ""},
 15502  		{"SYS_SIGQUEUEINFO", Const, 1, ""},
 15503  		{"SYS_SIGRETURN", Const, 0, ""},
 15504  		{"SYS_SIGSUSPEND", Const, 0, ""},
 15505  		{"SYS_SIGSUSPEND_NOCANCEL", Const, 0, ""},
 15506  		{"SYS_SIGTIMEDWAIT", Const, 0, ""},
 15507  		{"SYS_SIGWAIT", Const, 0, ""},
 15508  		{"SYS_SIGWAITINFO", Const, 0, ""},
 15509  		{"SYS_SOCKET", Const, 0, ""},
 15510  		{"SYS_SOCKETCALL", Const, 0, ""},
 15511  		{"SYS_SOCKETPAIR", Const, 0, ""},
 15512  		{"SYS_SPLICE", Const, 0, ""},
 15513  		{"SYS_SSETMASK", Const, 0, ""},
 15514  		{"SYS_SSTK", Const, 0, ""},
 15515  		{"SYS_STACK_SNAPSHOT", Const, 0, ""},
 15516  		{"SYS_STAT", Const, 0, ""},
 15517  		{"SYS_STAT64", Const, 0, ""},
 15518  		{"SYS_STAT64_EXTENDED", Const, 0, ""},
 15519  		{"SYS_STATFS", Const, 0, ""},
 15520  		{"SYS_STATFS64", Const, 0, ""},
 15521  		{"SYS_STATV", Const, 0, ""},
 15522  		{"SYS_STATVFS1", Const, 1, ""},
 15523  		{"SYS_STAT_EXTENDED", Const, 0, ""},
 15524  		{"SYS_STIME", Const, 0, ""},
 15525  		{"SYS_STTY", Const, 0, ""},
 15526  		{"SYS_SWAPCONTEXT", Const, 0, ""},
 15527  		{"SYS_SWAPCTL", Const, 1, ""},
 15528  		{"SYS_SWAPOFF", Const, 0, ""},
 15529  		{"SYS_SWAPON", Const, 0, ""},
 15530  		{"SYS_SYMLINK", Const, 0, ""},
 15531  		{"SYS_SYMLINKAT", Const, 0, ""},
 15532  		{"SYS_SYNC", Const, 0, ""},
 15533  		{"SYS_SYNCFS", Const, 0, ""},
 15534  		{"SYS_SYNC_FILE_RANGE", Const, 0, ""},
 15535  		{"SYS_SYSARCH", Const, 0, ""},
 15536  		{"SYS_SYSCALL", Const, 0, ""},
 15537  		{"SYS_SYSCALL_BASE", Const, 0, ""},
 15538  		{"SYS_SYSFS", Const, 0, ""},
 15539  		{"SYS_SYSINFO", Const, 0, ""},
 15540  		{"SYS_SYSLOG", Const, 0, ""},
 15541  		{"SYS_TEE", Const, 0, ""},
 15542  		{"SYS_TGKILL", Const, 0, ""},
 15543  		{"SYS_THREAD_SELFID", Const, 0, ""},
 15544  		{"SYS_THR_CREATE", Const, 0, ""},
 15545  		{"SYS_THR_EXIT", Const, 0, ""},
 15546  		{"SYS_THR_KILL", Const, 0, ""},
 15547  		{"SYS_THR_KILL2", Const, 0, ""},
 15548  		{"SYS_THR_NEW", Const, 0, ""},
 15549  		{"SYS_THR_SELF", Const, 0, ""},
 15550  		{"SYS_THR_SET_NAME", Const, 0, ""},
 15551  		{"SYS_THR_SUSPEND", Const, 0, ""},
 15552  		{"SYS_THR_WAKE", Const, 0, ""},
 15553  		{"SYS_TIME", Const, 0, ""},
 15554  		{"SYS_TIMERFD_CREATE", Const, 0, ""},
 15555  		{"SYS_TIMERFD_GETTIME", Const, 0, ""},
 15556  		{"SYS_TIMERFD_SETTIME", Const, 0, ""},
 15557  		{"SYS_TIMER_CREATE", Const, 0, ""},
 15558  		{"SYS_TIMER_DELETE", Const, 0, ""},
 15559  		{"SYS_TIMER_GETOVERRUN", Const, 0, ""},
 15560  		{"SYS_TIMER_GETTIME", Const, 0, ""},
 15561  		{"SYS_TIMER_SETTIME", Const, 0, ""},
 15562  		{"SYS_TIMES", Const, 0, ""},
 15563  		{"SYS_TKILL", Const, 0, ""},
 15564  		{"SYS_TRUNCATE", Const, 0, ""},
 15565  		{"SYS_TRUNCATE64", Const, 0, ""},
 15566  		{"SYS_TUXCALL", Const, 0, ""},
 15567  		{"SYS_UGETRLIMIT", Const, 0, ""},
 15568  		{"SYS_ULIMIT", Const, 0, ""},
 15569  		{"SYS_UMASK", Const, 0, ""},
 15570  		{"SYS_UMASK_EXTENDED", Const, 0, ""},
 15571  		{"SYS_UMOUNT", Const, 0, ""},
 15572  		{"SYS_UMOUNT2", Const, 0, ""},
 15573  		{"SYS_UNAME", Const, 0, ""},
 15574  		{"SYS_UNDELETE", Const, 0, ""},
 15575  		{"SYS_UNLINK", Const, 0, ""},
 15576  		{"SYS_UNLINKAT", Const, 0, ""},
 15577  		{"SYS_UNMOUNT", Const, 0, ""},
 15578  		{"SYS_UNSHARE", Const, 0, ""},
 15579  		{"SYS_USELIB", Const, 0, ""},
 15580  		{"SYS_USTAT", Const, 0, ""},
 15581  		{"SYS_UTIME", Const, 0, ""},
 15582  		{"SYS_UTIMENSAT", Const, 0, ""},
 15583  		{"SYS_UTIMES", Const, 0, ""},
 15584  		{"SYS_UTRACE", Const, 0, ""},
 15585  		{"SYS_UUIDGEN", Const, 0, ""},
 15586  		{"SYS_VADVISE", Const, 1, ""},
 15587  		{"SYS_VFORK", Const, 0, ""},
 15588  		{"SYS_VHANGUP", Const, 0, ""},
 15589  		{"SYS_VM86", Const, 0, ""},
 15590  		{"SYS_VM86OLD", Const, 0, ""},
 15591  		{"SYS_VMSPLICE", Const, 0, ""},
 15592  		{"SYS_VM_PRESSURE_MONITOR", Const, 0, ""},
 15593  		{"SYS_VSERVER", Const, 0, ""},
 15594  		{"SYS_WAIT4", Const, 0, ""},
 15595  		{"SYS_WAIT4_NOCANCEL", Const, 0, ""},
 15596  		{"SYS_WAIT6", Const, 1, ""},
 15597  		{"SYS_WAITEVENT", Const, 0, ""},
 15598  		{"SYS_WAITID", Const, 0, ""},
 15599  		{"SYS_WAITID_NOCANCEL", Const, 0, ""},
 15600  		{"SYS_WAITPID", Const, 0, ""},
 15601  		{"SYS_WATCHEVENT", Const, 0, ""},
 15602  		{"SYS_WORKQ_KERNRETURN", Const, 0, ""},
 15603  		{"SYS_WORKQ_OPEN", Const, 0, ""},
 15604  		{"SYS_WRITE", Const, 0, ""},
 15605  		{"SYS_WRITEV", Const, 0, ""},
 15606  		{"SYS_WRITEV_NOCANCEL", Const, 0, ""},
 15607  		{"SYS_WRITE_NOCANCEL", Const, 0, ""},
 15608  		{"SYS_YIELD", Const, 0, ""},
 15609  		{"SYS__LLSEEK", Const, 0, ""},
 15610  		{"SYS__LWP_CONTINUE", Const, 1, ""},
 15611  		{"SYS__LWP_CREATE", Const, 1, ""},
 15612  		{"SYS__LWP_CTL", Const, 1, ""},
 15613  		{"SYS__LWP_DETACH", Const, 1, ""},
 15614  		{"SYS__LWP_EXIT", Const, 1, ""},
 15615  		{"SYS__LWP_GETNAME", Const, 1, ""},
 15616  		{"SYS__LWP_GETPRIVATE", Const, 1, ""},
 15617  		{"SYS__LWP_KILL", Const, 1, ""},
 15618  		{"SYS__LWP_PARK", Const, 1, ""},
 15619  		{"SYS__LWP_SELF", Const, 1, ""},
 15620  		{"SYS__LWP_SETNAME", Const, 1, ""},
 15621  		{"SYS__LWP_SETPRIVATE", Const, 1, ""},
 15622  		{"SYS__LWP_SUSPEND", Const, 1, ""},
 15623  		{"SYS__LWP_UNPARK", Const, 1, ""},
 15624  		{"SYS__LWP_UNPARK_ALL", Const, 1, ""},
 15625  		{"SYS__LWP_WAIT", Const, 1, ""},
 15626  		{"SYS__LWP_WAKEUP", Const, 1, ""},
 15627  		{"SYS__NEWSELECT", Const, 0, ""},
 15628  		{"SYS__PSET_BIND", Const, 1, ""},
 15629  		{"SYS__SCHED_GETAFFINITY", Const, 1, ""},
 15630  		{"SYS__SCHED_GETPARAM", Const, 1, ""},
 15631  		{"SYS__SCHED_SETAFFINITY", Const, 1, ""},
 15632  		{"SYS__SCHED_SETPARAM", Const, 1, ""},
 15633  		{"SYS__SYSCTL", Const, 0, ""},
 15634  		{"SYS__UMTX_LOCK", Const, 0, ""},
 15635  		{"SYS__UMTX_OP", Const, 0, ""},
 15636  		{"SYS__UMTX_UNLOCK", Const, 0, ""},
 15637  		{"SYS___ACL_ACLCHECK_FD", Const, 0, ""},
 15638  		{"SYS___ACL_ACLCHECK_FILE", Const, 0, ""},
 15639  		{"SYS___ACL_ACLCHECK_LINK", Const, 0, ""},
 15640  		{"SYS___ACL_DELETE_FD", Const, 0, ""},
 15641  		{"SYS___ACL_DELETE_FILE", Const, 0, ""},
 15642  		{"SYS___ACL_DELETE_LINK", Const, 0, ""},
 15643  		{"SYS___ACL_GET_FD", Const, 0, ""},
 15644  		{"SYS___ACL_GET_FILE", Const, 0, ""},
 15645  		{"SYS___ACL_GET_LINK", Const, 0, ""},
 15646  		{"SYS___ACL_SET_FD", Const, 0, ""},
 15647  		{"SYS___ACL_SET_FILE", Const, 0, ""},
 15648  		{"SYS___ACL_SET_LINK", Const, 0, ""},
 15649  		{"SYS___CAP_RIGHTS_GET", Const, 14, ""},
 15650  		{"SYS___CLONE", Const, 1, ""},
 15651  		{"SYS___DISABLE_THREADSIGNAL", Const, 0, ""},
 15652  		{"SYS___GETCWD", Const, 0, ""},
 15653  		{"SYS___GETLOGIN", Const, 1, ""},
 15654  		{"SYS___GET_TCB", Const, 1, ""},
 15655  		{"SYS___MAC_EXECVE", Const, 0, ""},
 15656  		{"SYS___MAC_GETFSSTAT", Const, 0, ""},
 15657  		{"SYS___MAC_GET_FD", Const, 0, ""},
 15658  		{"SYS___MAC_GET_FILE", Const, 0, ""},
 15659  		{"SYS___MAC_GET_LCID", Const, 0, ""},
 15660  		{"SYS___MAC_GET_LCTX", Const, 0, ""},
 15661  		{"SYS___MAC_GET_LINK", Const, 0, ""},
 15662  		{"SYS___MAC_GET_MOUNT", Const, 0, ""},
 15663  		{"SYS___MAC_GET_PID", Const, 0, ""},
 15664  		{"SYS___MAC_GET_PROC", Const, 0, ""},
 15665  		{"SYS___MAC_MOUNT", Const, 0, ""},
 15666  		{"SYS___MAC_SET_FD", Const, 0, ""},
 15667  		{"SYS___MAC_SET_FILE", Const, 0, ""},
 15668  		{"SYS___MAC_SET_LCTX", Const, 0, ""},
 15669  		{"SYS___MAC_SET_LINK", Const, 0, ""},
 15670  		{"SYS___MAC_SET_PROC", Const, 0, ""},
 15671  		{"SYS___MAC_SYSCALL", Const, 0, ""},
 15672  		{"SYS___OLD_SEMWAIT_SIGNAL", Const, 0, ""},
 15673  		{"SYS___OLD_SEMWAIT_SIGNAL_NOCANCEL", Const, 0, ""},
 15674  		{"SYS___POSIX_CHOWN", Const, 1, ""},
 15675  		{"SYS___POSIX_FCHOWN", Const, 1, ""},
 15676  		{"SYS___POSIX_LCHOWN", Const, 1, ""},
 15677  		{"SYS___POSIX_RENAME", Const, 1, ""},
 15678  		{"SYS___PTHREAD_CANCELED", Const, 0, ""},
 15679  		{"SYS___PTHREAD_CHDIR", Const, 0, ""},
 15680  		{"SYS___PTHREAD_FCHDIR", Const, 0, ""},
 15681  		{"SYS___PTHREAD_KILL", Const, 0, ""},
 15682  		{"SYS___PTHREAD_MARKCANCEL", Const, 0, ""},
 15683  		{"SYS___PTHREAD_SIGMASK", Const, 0, ""},
 15684  		{"SYS___QUOTACTL", Const, 1, ""},
 15685  		{"SYS___SEMCTL", Const, 1, ""},
 15686  		{"SYS___SEMWAIT_SIGNAL", Const, 0, ""},
 15687  		{"SYS___SEMWAIT_SIGNAL_NOCANCEL", Const, 0, ""},
 15688  		{"SYS___SETLOGIN", Const, 1, ""},
 15689  		{"SYS___SETUGID", Const, 0, ""},
 15690  		{"SYS___SET_TCB", Const, 1, ""},
 15691  		{"SYS___SIGACTION_SIGTRAMP", Const, 1, ""},
 15692  		{"SYS___SIGTIMEDWAIT", Const, 1, ""},
 15693  		{"SYS___SIGWAIT", Const, 0, ""},
 15694  		{"SYS___SIGWAIT_NOCANCEL", Const, 0, ""},
 15695  		{"SYS___SYSCTL", Const, 0, ""},
 15696  		{"SYS___TFORK", Const, 1, ""},
 15697  		{"SYS___THREXIT", Const, 1, ""},
 15698  		{"SYS___THRSIGDIVERT", Const, 1, ""},
 15699  		{"SYS___THRSLEEP", Const, 1, ""},
 15700  		{"SYS___THRWAKEUP", Const, 1, ""},
 15701  		{"S_ARCH1", Const, 1, ""},
 15702  		{"S_ARCH2", Const, 1, ""},
 15703  		{"S_BLKSIZE", Const, 0, ""},
 15704  		{"S_IEXEC", Const, 0, ""},
 15705  		{"S_IFBLK", Const, 0, ""},
 15706  		{"S_IFCHR", Const, 0, ""},
 15707  		{"S_IFDIR", Const, 0, ""},
 15708  		{"S_IFIFO", Const, 0, ""},
 15709  		{"S_IFLNK", Const, 0, ""},
 15710  		{"S_IFMT", Const, 0, ""},
 15711  		{"S_IFREG", Const, 0, ""},
 15712  		{"S_IFSOCK", Const, 0, ""},
 15713  		{"S_IFWHT", Const, 0, ""},
 15714  		{"S_IREAD", Const, 0, ""},
 15715  		{"S_IRGRP", Const, 0, ""},
 15716  		{"S_IROTH", Const, 0, ""},
 15717  		{"S_IRUSR", Const, 0, ""},
 15718  		{"S_IRWXG", Const, 0, ""},
 15719  		{"S_IRWXO", Const, 0, ""},
 15720  		{"S_IRWXU", Const, 0, ""},
 15721  		{"S_ISGID", Const, 0, ""},
 15722  		{"S_ISTXT", Const, 0, ""},
 15723  		{"S_ISUID", Const, 0, ""},
 15724  		{"S_ISVTX", Const, 0, ""},
 15725  		{"S_IWGRP", Const, 0, ""},
 15726  		{"S_IWOTH", Const, 0, ""},
 15727  		{"S_IWRITE", Const, 0, ""},
 15728  		{"S_IWUSR", Const, 0, ""},
 15729  		{"S_IXGRP", Const, 0, ""},
 15730  		{"S_IXOTH", Const, 0, ""},
 15731  		{"S_IXUSR", Const, 0, ""},
 15732  		{"S_LOGIN_SET", Const, 1, ""},
 15733  		{"SecurityAttributes", Type, 0, ""},
 15734  		{"SecurityAttributes.InheritHandle", Field, 0, ""},
 15735  		{"SecurityAttributes.Length", Field, 0, ""},
 15736  		{"SecurityAttributes.SecurityDescriptor", Field, 0, ""},
 15737  		{"Seek", Func, 0, "func(fd int, offset int64, whence int) (off int64, err error)"},
 15738  		{"Select", Func, 0, "func(nfd int, r *FdSet, w *FdSet, e *FdSet, timeout *Timeval) (n int, err error)"},
 15739  		{"Sendfile", Func, 0, "func(outfd int, infd int, offset *int64, count int) (written int, err error)"},
 15740  		{"Sendmsg", Func, 0, "func(fd int, p []byte, oob []byte, to Sockaddr, flags int) (err error)"},
 15741  		{"SendmsgN", Func, 3, "func(fd int, p []byte, oob []byte, to Sockaddr, flags int) (n int, err error)"},
 15742  		{"Sendto", Func, 0, "func(fd int, p []byte, flags int, to Sockaddr) (err error)"},
 15743  		{"Servent", Type, 0, ""},
 15744  		{"Servent.Aliases", Field, 0, ""},
 15745  		{"Servent.Name", Field, 0, ""},
 15746  		{"Servent.Port", Field, 0, ""},
 15747  		{"Servent.Proto", Field, 0, ""},
 15748  		{"SetBpf", Func, 0, ""},
 15749  		{"SetBpfBuflen", Func, 0, ""},
 15750  		{"SetBpfDatalink", Func, 0, ""},
 15751  		{"SetBpfHeadercmpl", Func, 0, ""},
 15752  		{"SetBpfImmediate", Func, 0, ""},
 15753  		{"SetBpfInterface", Func, 0, ""},
 15754  		{"SetBpfPromisc", Func, 0, ""},
 15755  		{"SetBpfTimeout", Func, 0, ""},
 15756  		{"SetCurrentDirectory", Func, 0, ""},
 15757  		{"SetEndOfFile", Func, 0, ""},
 15758  		{"SetEnvironmentVariable", Func, 0, ""},
 15759  		{"SetFileAttributes", Func, 0, ""},
 15760  		{"SetFileCompletionNotificationModes", Func, 2, ""},
 15761  		{"SetFilePointer", Func, 0, ""},
 15762  		{"SetFileTime", Func, 0, ""},
 15763  		{"SetHandleInformation", Func, 0, ""},
 15764  		{"SetKevent", Func, 0, ""},
 15765  		{"SetLsfPromisc", Func, 0, "func(name string, m bool) error"},
 15766  		{"SetNonblock", Func, 0, "func(fd int, nonblocking bool) (err error)"},
 15767  		{"Setdomainname", Func, 0, "func(p []byte) (err error)"},
 15768  		{"Setegid", Func, 0, "func(egid int) (err error)"},
 15769  		{"Setenv", Func, 0, "func(key string, value string) error"},
 15770  		{"Seteuid", Func, 0, "func(euid int) (err error)"},
 15771  		{"Setfsgid", Func, 0, "func(gid int) (err error)"},
 15772  		{"Setfsuid", Func, 0, "func(uid int) (err error)"},
 15773  		{"Setgid", Func, 0, "func(gid int) (err error)"},
 15774  		{"Setgroups", Func, 0, "func(gids []int) (err error)"},
 15775  		{"Sethostname", Func, 0, "func(p []byte) (err error)"},
 15776  		{"Setlogin", Func, 0, ""},
 15777  		{"Setpgid", Func, 0, "func(pid int, pgid int) (err error)"},
 15778  		{"Setpriority", Func, 0, "func(which int, who int, prio int) (err error)"},
 15779  		{"Setprivexec", Func, 0, ""},
 15780  		{"Setregid", Func, 0, "func(rgid int, egid int) (err error)"},
 15781  		{"Setresgid", Func, 0, "func(rgid int, egid int, sgid int) (err error)"},
 15782  		{"Setresuid", Func, 0, "func(ruid int, euid int, suid int) (err error)"},
 15783  		{"Setreuid", Func, 0, "func(ruid int, euid int) (err error)"},
 15784  		{"Setrlimit", Func, 0, "func(resource int, rlim *Rlimit) error"},
 15785  		{"Setsid", Func, 0, "func() (pid int, err error)"},
 15786  		{"Setsockopt", Func, 0, ""},
 15787  		{"SetsockoptByte", Func, 0, "func(fd int, level int, opt int, value byte) (err error)"},
 15788  		{"SetsockoptICMPv6Filter", Func, 2, "func(fd int, level int, opt int, filter *ICMPv6Filter) error"},
 15789  		{"SetsockoptIPMreq", Func, 0, "func(fd int, level int, opt int, mreq *IPMreq) (err error)"},
 15790  		{"SetsockoptIPMreqn", Func, 0, "func(fd int, level int, opt int, mreq *IPMreqn) (err error)"},
 15791  		{"SetsockoptIPv6Mreq", Func, 0, "func(fd int, level int, opt int, mreq *IPv6Mreq) (err error)"},
 15792  		{"SetsockoptInet4Addr", Func, 0, "func(fd int, level int, opt int, value [4]byte) (err error)"},
 15793  		{"SetsockoptInt", Func, 0, "func(fd int, level int, opt int, value int) (err error)"},
 15794  		{"SetsockoptLinger", Func, 0, "func(fd int, level int, opt int, l *Linger) (err error)"},
 15795  		{"SetsockoptString", Func, 0, "func(fd int, level int, opt int, s string) (err error)"},
 15796  		{"SetsockoptTimeval", Func, 0, "func(fd int, level int, opt int, tv *Timeval) (err error)"},
 15797  		{"Settimeofday", Func, 0, "func(tv *Timeval) (err error)"},
 15798  		{"Setuid", Func, 0, "func(uid int) (err error)"},
 15799  		{"Setxattr", Func, 1, "func(path string, attr string, data []byte, flags int) (err error)"},
 15800  		{"Shutdown", Func, 0, "func(fd int, how int) (err error)"},
 15801  		{"SidTypeAlias", Const, 0, ""},
 15802  		{"SidTypeComputer", Const, 0, ""},
 15803  		{"SidTypeDeletedAccount", Const, 0, ""},
 15804  		{"SidTypeDomain", Const, 0, ""},
 15805  		{"SidTypeGroup", Const, 0, ""},
 15806  		{"SidTypeInvalid", Const, 0, ""},
 15807  		{"SidTypeLabel", Const, 0, ""},
 15808  		{"SidTypeUnknown", Const, 0, ""},
 15809  		{"SidTypeUser", Const, 0, ""},
 15810  		{"SidTypeWellKnownGroup", Const, 0, ""},
 15811  		{"Signal", Type, 0, ""},
 15812  		{"SizeofBpfHdr", Const, 0, ""},
 15813  		{"SizeofBpfInsn", Const, 0, ""},
 15814  		{"SizeofBpfProgram", Const, 0, ""},
 15815  		{"SizeofBpfStat", Const, 0, ""},
 15816  		{"SizeofBpfVersion", Const, 0, ""},
 15817  		{"SizeofBpfZbuf", Const, 0, ""},
 15818  		{"SizeofBpfZbufHeader", Const, 0, ""},
 15819  		{"SizeofCmsghdr", Const, 0, ""},
 15820  		{"SizeofICMPv6Filter", Const, 2, ""},
 15821  		{"SizeofIPMreq", Const, 0, ""},
 15822  		{"SizeofIPMreqn", Const, 0, ""},
 15823  		{"SizeofIPv6MTUInfo", Const, 2, ""},
 15824  		{"SizeofIPv6Mreq", Const, 0, ""},
 15825  		{"SizeofIfAddrmsg", Const, 0, ""},
 15826  		{"SizeofIfAnnounceMsghdr", Const, 1, ""},
 15827  		{"SizeofIfData", Const, 0, ""},
 15828  		{"SizeofIfInfomsg", Const, 0, ""},
 15829  		{"SizeofIfMsghdr", Const, 0, ""},
 15830  		{"SizeofIfaMsghdr", Const, 0, ""},
 15831  		{"SizeofIfmaMsghdr", Const, 0, ""},
 15832  		{"SizeofIfmaMsghdr2", Const, 0, ""},
 15833  		{"SizeofInet4Pktinfo", Const, 0, ""},
 15834  		{"SizeofInet6Pktinfo", Const, 0, ""},
 15835  		{"SizeofInotifyEvent", Const, 0, ""},
 15836  		{"SizeofLinger", Const, 0, ""},
 15837  		{"SizeofMsghdr", Const, 0, ""},
 15838  		{"SizeofNlAttr", Const, 0, ""},
 15839  		{"SizeofNlMsgerr", Const, 0, ""},
 15840  		{"SizeofNlMsghdr", Const, 0, ""},
 15841  		{"SizeofRtAttr", Const, 0, ""},
 15842  		{"SizeofRtGenmsg", Const, 0, ""},
 15843  		{"SizeofRtMetrics", Const, 0, ""},
 15844  		{"SizeofRtMsg", Const, 0, ""},
 15845  		{"SizeofRtMsghdr", Const, 0, ""},
 15846  		{"SizeofRtNexthop", Const, 0, ""},
 15847  		{"SizeofSockFilter", Const, 0, ""},
 15848  		{"SizeofSockFprog", Const, 0, ""},
 15849  		{"SizeofSockaddrAny", Const, 0, ""},
 15850  		{"SizeofSockaddrDatalink", Const, 0, ""},
 15851  		{"SizeofSockaddrInet4", Const, 0, ""},
 15852  		{"SizeofSockaddrInet6", Const, 0, ""},
 15853  		{"SizeofSockaddrLinklayer", Const, 0, ""},
 15854  		{"SizeofSockaddrNetlink", Const, 0, ""},
 15855  		{"SizeofSockaddrUnix", Const, 0, ""},
 15856  		{"SizeofTCPInfo", Const, 1, ""},
 15857  		{"SizeofUcred", Const, 0, ""},
 15858  		{"SlicePtrFromStrings", Func, 1, "func(ss []string) ([]*byte, error)"},
 15859  		{"SockFilter", Type, 0, ""},
 15860  		{"SockFilter.Code", Field, 0, ""},
 15861  		{"SockFilter.Jf", Field, 0, ""},
 15862  		{"SockFilter.Jt", Field, 0, ""},
 15863  		{"SockFilter.K", Field, 0, ""},
 15864  		{"SockFprog", Type, 0, ""},
 15865  		{"SockFprog.Filter", Field, 0, ""},
 15866  		{"SockFprog.Len", Field, 0, ""},
 15867  		{"SockFprog.Pad_cgo_0", Field, 0, ""},
 15868  		{"Sockaddr", Type, 0, ""},
 15869  		{"SockaddrDatalink", Type, 0, ""},
 15870  		{"SockaddrDatalink.Alen", Field, 0, ""},
 15871  		{"SockaddrDatalink.Data", Field, 0, ""},
 15872  		{"SockaddrDatalink.Family", Field, 0, ""},
 15873  		{"SockaddrDatalink.Index", Field, 0, ""},
 15874  		{"SockaddrDatalink.Len", Field, 0, ""},
 15875  		{"SockaddrDatalink.Nlen", Field, 0, ""},
 15876  		{"SockaddrDatalink.Slen", Field, 0, ""},
 15877  		{"SockaddrDatalink.Type", Field, 0, ""},
 15878  		{"SockaddrGen", Type, 0, ""},
 15879  		{"SockaddrInet4", Type, 0, ""},
 15880  		{"SockaddrInet4.Addr", Field, 0, ""},
 15881  		{"SockaddrInet4.Port", Field, 0, ""},
 15882  		{"SockaddrInet6", Type, 0, ""},
 15883  		{"SockaddrInet6.Addr", Field, 0, ""},
 15884  		{"SockaddrInet6.Port", Field, 0, ""},
 15885  		{"SockaddrInet6.ZoneId", Field, 0, ""},
 15886  		{"SockaddrLinklayer", Type, 0, ""},
 15887  		{"SockaddrLinklayer.Addr", Field, 0, ""},
 15888  		{"SockaddrLinklayer.Halen", Field, 0, ""},
 15889  		{"SockaddrLinklayer.Hatype", Field, 0, ""},
 15890  		{"SockaddrLinklayer.Ifindex", Field, 0, ""},
 15891  		{"SockaddrLinklayer.Pkttype", Field, 0, ""},
 15892  		{"SockaddrLinklayer.Protocol", Field, 0, ""},
 15893  		{"SockaddrNetlink", Type, 0, ""},
 15894  		{"SockaddrNetlink.Family", Field, 0, ""},
 15895  		{"SockaddrNetlink.Groups", Field, 0, ""},
 15896  		{"SockaddrNetlink.Pad", Field, 0, ""},
 15897  		{"SockaddrNetlink.Pid", Field, 0, ""},
 15898  		{"SockaddrUnix", Type, 0, ""},
 15899  		{"SockaddrUnix.Name", Field, 0, ""},
 15900  		{"Socket", Func, 0, "func(domain int, typ int, proto int) (fd int, err error)"},
 15901  		{"SocketControlMessage", Type, 0, ""},
 15902  		{"SocketControlMessage.Data", Field, 0, ""},
 15903  		{"SocketControlMessage.Header", Field, 0, ""},
 15904  		{"SocketDisableIPv6", Var, 0, ""},
 15905  		{"Socketpair", Func, 0, "func(domain int, typ int, proto int) (fd [2]int, err error)"},
 15906  		{"Splice", Func, 0, "func(rfd int, roff *int64, wfd int, woff *int64, len int, flags int) (n int64, err error)"},
 15907  		{"StartProcess", Func, 0, "func(argv0 string, argv []string, attr *ProcAttr) (pid int, handle uintptr, err error)"},
 15908  		{"StartupInfo", Type, 0, ""},
 15909  		{"StartupInfo.Cb", Field, 0, ""},
 15910  		{"StartupInfo.Desktop", Field, 0, ""},
 15911  		{"StartupInfo.FillAttribute", Field, 0, ""},
 15912  		{"StartupInfo.Flags", Field, 0, ""},
 15913  		{"StartupInfo.ShowWindow", Field, 0, ""},
 15914  		{"StartupInfo.StdErr", Field, 0, ""},
 15915  		{"StartupInfo.StdInput", Field, 0, ""},
 15916  		{"StartupInfo.StdOutput", Field, 0, ""},
 15917  		{"StartupInfo.Title", Field, 0, ""},
 15918  		{"StartupInfo.X", Field, 0, ""},
 15919  		{"StartupInfo.XCountChars", Field, 0, ""},
 15920  		{"StartupInfo.XSize", Field, 0, ""},
 15921  		{"StartupInfo.Y", Field, 0, ""},
 15922  		{"StartupInfo.YCountChars", Field, 0, ""},
 15923  		{"StartupInfo.YSize", Field, 0, ""},
 15924  		{"Stat", Func, 0, "func(path string, stat *Stat_t) (err error)"},
 15925  		{"Stat_t", Type, 0, ""},
 15926  		{"Stat_t.Atim", Field, 0, ""},
 15927  		{"Stat_t.Atim_ext", Field, 12, ""},
 15928  		{"Stat_t.Atimespec", Field, 0, ""},
 15929  		{"Stat_t.Birthtimespec", Field, 0, ""},
 15930  		{"Stat_t.Blksize", Field, 0, ""},
 15931  		{"Stat_t.Blocks", Field, 0, ""},
 15932  		{"Stat_t.Btim_ext", Field, 12, ""},
 15933  		{"Stat_t.Ctim", Field, 0, ""},
 15934  		{"Stat_t.Ctim_ext", Field, 12, ""},
 15935  		{"Stat_t.Ctimespec", Field, 0, ""},
 15936  		{"Stat_t.Dev", Field, 0, ""},
 15937  		{"Stat_t.Flags", Field, 0, ""},
 15938  		{"Stat_t.Gen", Field, 0, ""},
 15939  		{"Stat_t.Gid", Field, 0, ""},
 15940  		{"Stat_t.Ino", Field, 0, ""},
 15941  		{"Stat_t.Lspare", Field, 0, ""},
 15942  		{"Stat_t.Lspare0", Field, 2, ""},
 15943  		{"Stat_t.Lspare1", Field, 2, ""},
 15944  		{"Stat_t.Mode", Field, 0, ""},
 15945  		{"Stat_t.Mtim", Field, 0, ""},
 15946  		{"Stat_t.Mtim_ext", Field, 12, ""},
 15947  		{"Stat_t.Mtimespec", Field, 0, ""},
 15948  		{"Stat_t.Nlink", Field, 0, ""},
 15949  		{"Stat_t.Pad_cgo_0", Field, 0, ""},
 15950  		{"Stat_t.Pad_cgo_1", Field, 0, ""},
 15951  		{"Stat_t.Pad_cgo_2", Field, 0, ""},
 15952  		{"Stat_t.Padding0", Field, 12, ""},
 15953  		{"Stat_t.Padding1", Field, 12, ""},
 15954  		{"Stat_t.Qspare", Field, 0, ""},
 15955  		{"Stat_t.Rdev", Field, 0, ""},
 15956  		{"Stat_t.Size", Field, 0, ""},
 15957  		{"Stat_t.Spare", Field, 2, ""},
 15958  		{"Stat_t.Uid", Field, 0, ""},
 15959  		{"Stat_t.X__pad0", Field, 0, ""},
 15960  		{"Stat_t.X__pad1", Field, 0, ""},
 15961  		{"Stat_t.X__pad2", Field, 0, ""},
 15962  		{"Stat_t.X__st_birthtim", Field, 2, ""},
 15963  		{"Stat_t.X__st_ino", Field, 0, ""},
 15964  		{"Stat_t.X__unused", Field, 0, ""},
 15965  		{"Statfs", Func, 0, "func(path string, buf *Statfs_t) (err error)"},
 15966  		{"Statfs_t", Type, 0, ""},
 15967  		{"Statfs_t.Asyncreads", Field, 0, ""},
 15968  		{"Statfs_t.Asyncwrites", Field, 0, ""},
 15969  		{"Statfs_t.Bavail", Field, 0, ""},
 15970  		{"Statfs_t.Bfree", Field, 0, ""},
 15971  		{"Statfs_t.Blocks", Field, 0, ""},
 15972  		{"Statfs_t.Bsize", Field, 0, ""},
 15973  		{"Statfs_t.Charspare", Field, 0, ""},
 15974  		{"Statfs_t.F_asyncreads", Field, 2, ""},
 15975  		{"Statfs_t.F_asyncwrites", Field, 2, ""},
 15976  		{"Statfs_t.F_bavail", Field, 2, ""},
 15977  		{"Statfs_t.F_bfree", Field, 2, ""},
 15978  		{"Statfs_t.F_blocks", Field, 2, ""},
 15979  		{"Statfs_t.F_bsize", Field, 2, ""},
 15980  		{"Statfs_t.F_ctime", Field, 2, ""},
 15981  		{"Statfs_t.F_favail", Field, 2, ""},
 15982  		{"Statfs_t.F_ffree", Field, 2, ""},
 15983  		{"Statfs_t.F_files", Field, 2, ""},
 15984  		{"Statfs_t.F_flags", Field, 2, ""},
 15985  		{"Statfs_t.F_fsid", Field, 2, ""},
 15986  		{"Statfs_t.F_fstypename", Field, 2, ""},
 15987  		{"Statfs_t.F_iosize", Field, 2, ""},
 15988  		{"Statfs_t.F_mntfromname", Field, 2, ""},
 15989  		{"Statfs_t.F_mntfromspec", Field, 3, ""},
 15990  		{"Statfs_t.F_mntonname", Field, 2, ""},
 15991  		{"Statfs_t.F_namemax", Field, 2, ""},
 15992  		{"Statfs_t.F_owner", Field, 2, ""},
 15993  		{"Statfs_t.F_spare", Field, 2, ""},
 15994  		{"Statfs_t.F_syncreads", Field, 2, ""},
 15995  		{"Statfs_t.F_syncwrites", Field, 2, ""},
 15996  		{"Statfs_t.Ffree", Field, 0, ""},
 15997  		{"Statfs_t.Files", Field, 0, ""},
 15998  		{"Statfs_t.Flags", Field, 0, ""},
 15999  		{"Statfs_t.Frsize", Field, 0, ""},
 16000  		{"Statfs_t.Fsid", Field, 0, ""},
 16001  		{"Statfs_t.Fssubtype", Field, 0, ""},
 16002  		{"Statfs_t.Fstypename", Field, 0, ""},
 16003  		{"Statfs_t.Iosize", Field, 0, ""},
 16004  		{"Statfs_t.Mntfromname", Field, 0, ""},
 16005  		{"Statfs_t.Mntonname", Field, 0, ""},
 16006  		{"Statfs_t.Mount_info", Field, 2, ""},
 16007  		{"Statfs_t.Namelen", Field, 0, ""},
 16008  		{"Statfs_t.Namemax", Field, 0, ""},
 16009  		{"Statfs_t.Owner", Field, 0, ""},
 16010  		{"Statfs_t.Pad_cgo_0", Field, 0, ""},
 16011  		{"Statfs_t.Pad_cgo_1", Field, 2, ""},
 16012  		{"Statfs_t.Reserved", Field, 0, ""},
 16013  		{"Statfs_t.Spare", Field, 0, ""},
 16014  		{"Statfs_t.Syncreads", Field, 0, ""},
 16015  		{"Statfs_t.Syncwrites", Field, 0, ""},
 16016  		{"Statfs_t.Type", Field, 0, ""},
 16017  		{"Statfs_t.Version", Field, 0, ""},
 16018  		{"Stderr", Var, 0, ""},
 16019  		{"Stdin", Var, 0, ""},
 16020  		{"Stdout", Var, 0, ""},
 16021  		{"StringBytePtr", Func, 0, "func(s string) *byte"},
 16022  		{"StringByteSlice", Func, 0, "func(s string) []byte"},
 16023  		{"StringSlicePtr", Func, 0, "func(ss []string) []*byte"},
 16024  		{"StringToSid", Func, 0, ""},
 16025  		{"StringToUTF16", Func, 0, ""},
 16026  		{"StringToUTF16Ptr", Func, 0, ""},
 16027  		{"Symlink", Func, 0, "func(oldpath string, newpath string) (err error)"},
 16028  		{"Sync", Func, 0, "func()"},
 16029  		{"SyncFileRange", Func, 0, "func(fd int, off int64, n int64, flags int) (err error)"},
 16030  		{"SysProcAttr", Type, 0, ""},
 16031  		{"SysProcAttr.AdditionalInheritedHandles", Field, 17, ""},
 16032  		{"SysProcAttr.AmbientCaps", Field, 9, ""},
 16033  		{"SysProcAttr.CgroupFD", Field, 20, ""},
 16034  		{"SysProcAttr.Chroot", Field, 0, ""},
 16035  		{"SysProcAttr.Cloneflags", Field, 2, ""},
 16036  		{"SysProcAttr.CmdLine", Field, 0, ""},
 16037  		{"SysProcAttr.CreationFlags", Field, 1, ""},
 16038  		{"SysProcAttr.Credential", Field, 0, ""},
 16039  		{"SysProcAttr.Ctty", Field, 1, ""},
 16040  		{"SysProcAttr.Foreground", Field, 5, ""},
 16041  		{"SysProcAttr.GidMappings", Field, 4, ""},
 16042  		{"SysProcAttr.GidMappingsEnableSetgroups", Field, 5, ""},
 16043  		{"SysProcAttr.HideWindow", Field, 0, ""},
 16044  		{"SysProcAttr.Jail", Field, 21, ""},
 16045  		{"SysProcAttr.NoInheritHandles", Field, 16, ""},
 16046  		{"SysProcAttr.Noctty", Field, 0, ""},
 16047  		{"SysProcAttr.ParentProcess", Field, 17, ""},
 16048  		{"SysProcAttr.Pdeathsig", Field, 0, ""},
 16049  		{"SysProcAttr.Pgid", Field, 5, ""},
 16050  		{"SysProcAttr.PidFD", Field, 22, ""},
 16051  		{"SysProcAttr.ProcessAttributes", Field, 13, ""},
 16052  		{"SysProcAttr.Ptrace", Field, 0, ""},
 16053  		{"SysProcAttr.Setctty", Field, 0, ""},
 16054  		{"SysProcAttr.Setpgid", Field, 0, ""},
 16055  		{"SysProcAttr.Setsid", Field, 0, ""},
 16056  		{"SysProcAttr.ThreadAttributes", Field, 13, ""},
 16057  		{"SysProcAttr.Token", Field, 10, ""},
 16058  		{"SysProcAttr.UidMappings", Field, 4, ""},
 16059  		{"SysProcAttr.Unshareflags", Field, 7, ""},
 16060  		{"SysProcAttr.UseCgroupFD", Field, 20, ""},
 16061  		{"SysProcIDMap", Type, 4, ""},
 16062  		{"SysProcIDMap.ContainerID", Field, 4, ""},
 16063  		{"SysProcIDMap.HostID", Field, 4, ""},
 16064  		{"SysProcIDMap.Size", Field, 4, ""},
 16065  		{"Syscall", Func, 0, "func(trap uintptr, a1 uintptr, a2 uintptr, a3 uintptr) (r1 uintptr, r2 uintptr, err Errno)"},
 16066  		{"Syscall12", Func, 0, ""},
 16067  		{"Syscall15", Func, 0, ""},
 16068  		{"Syscall18", Func, 12, ""},
 16069  		{"Syscall6", Func, 0, "func(trap uintptr, a1 uintptr, a2 uintptr, a3 uintptr, a4 uintptr, a5 uintptr, a6 uintptr) (r1 uintptr, r2 uintptr, err Errno)"},
 16070  		{"Syscall9", Func, 0, ""},
 16071  		{"SyscallN", Func, 18, ""},
 16072  		{"Sysctl", Func, 0, ""},
 16073  		{"SysctlUint32", Func, 0, ""},
 16074  		{"Sysctlnode", Type, 2, ""},
 16075  		{"Sysctlnode.Flags", Field, 2, ""},
 16076  		{"Sysctlnode.Name", Field, 2, ""},
 16077  		{"Sysctlnode.Num", Field, 2, ""},
 16078  		{"Sysctlnode.Un", Field, 2, ""},
 16079  		{"Sysctlnode.Ver", Field, 2, ""},
 16080  		{"Sysctlnode.X__rsvd", Field, 2, ""},
 16081  		{"Sysctlnode.X_sysctl_desc", Field, 2, ""},
 16082  		{"Sysctlnode.X_sysctl_func", Field, 2, ""},
 16083  		{"Sysctlnode.X_sysctl_parent", Field, 2, ""},
 16084  		{"Sysctlnode.X_sysctl_size", Field, 2, ""},
 16085  		{"Sysinfo", Func, 0, "func(info *Sysinfo_t) (err error)"},
 16086  		{"Sysinfo_t", Type, 0, ""},
 16087  		{"Sysinfo_t.Bufferram", Field, 0, ""},
 16088  		{"Sysinfo_t.Freehigh", Field, 0, ""},
 16089  		{"Sysinfo_t.Freeram", Field, 0, ""},
 16090  		{"Sysinfo_t.Freeswap", Field, 0, ""},
 16091  		{"Sysinfo_t.Loads", Field, 0, ""},
 16092  		{"Sysinfo_t.Pad", Field, 0, ""},
 16093  		{"Sysinfo_t.Pad_cgo_0", Field, 0, ""},
 16094  		{"Sysinfo_t.Pad_cgo_1", Field, 0, ""},
 16095  		{"Sysinfo_t.Procs", Field, 0, ""},
 16096  		{"Sysinfo_t.Sharedram", Field, 0, ""},
 16097  		{"Sysinfo_t.Totalhigh", Field, 0, ""},
 16098  		{"Sysinfo_t.Totalram", Field, 0, ""},
 16099  		{"Sysinfo_t.Totalswap", Field, 0, ""},
 16100  		{"Sysinfo_t.Unit", Field, 0, ""},
 16101  		{"Sysinfo_t.Uptime", Field, 0, ""},
 16102  		{"Sysinfo_t.X_f", Field, 0, ""},
 16103  		{"Systemtime", Type, 0, ""},
 16104  		{"Systemtime.Day", Field, 0, ""},
 16105  		{"Systemtime.DayOfWeek", Field, 0, ""},
 16106  		{"Systemtime.Hour", Field, 0, ""},
 16107  		{"Systemtime.Milliseconds", Field, 0, ""},
 16108  		{"Systemtime.Minute", Field, 0, ""},
 16109  		{"Systemtime.Month", Field, 0, ""},
 16110  		{"Systemtime.Second", Field, 0, ""},
 16111  		{"Systemtime.Year", Field, 0, ""},
 16112  		{"TCGETS", Const, 0, ""},
 16113  		{"TCIFLUSH", Const, 1, ""},
 16114  		{"TCIOFLUSH", Const, 1, ""},
 16115  		{"TCOFLUSH", Const, 1, ""},
 16116  		{"TCPInfo", Type, 1, ""},
 16117  		{"TCPInfo.Advmss", Field, 1, ""},
 16118  		{"TCPInfo.Ato", Field, 1, ""},
 16119  		{"TCPInfo.Backoff", Field, 1, ""},
 16120  		{"TCPInfo.Ca_state", Field, 1, ""},
 16121  		{"TCPInfo.Fackets", Field, 1, ""},
 16122  		{"TCPInfo.Last_ack_recv", Field, 1, ""},
 16123  		{"TCPInfo.Last_ack_sent", Field, 1, ""},
 16124  		{"TCPInfo.Last_data_recv", Field, 1, ""},
 16125  		{"TCPInfo.Last_data_sent", Field, 1, ""},
 16126  		{"TCPInfo.Lost", Field, 1, ""},
 16127  		{"TCPInfo.Options", Field, 1, ""},
 16128  		{"TCPInfo.Pad_cgo_0", Field, 1, ""},
 16129  		{"TCPInfo.Pmtu", Field, 1, ""},
 16130  		{"TCPInfo.Probes", Field, 1, ""},
 16131  		{"TCPInfo.Rcv_mss", Field, 1, ""},
 16132  		{"TCPInfo.Rcv_rtt", Field, 1, ""},
 16133  		{"TCPInfo.Rcv_space", Field, 1, ""},
 16134  		{"TCPInfo.Rcv_ssthresh", Field, 1, ""},
 16135  		{"TCPInfo.Reordering", Field, 1, ""},
 16136  		{"TCPInfo.Retrans", Field, 1, ""},
 16137  		{"TCPInfo.Retransmits", Field, 1, ""},
 16138  		{"TCPInfo.Rto", Field, 1, ""},
 16139  		{"TCPInfo.Rtt", Field, 1, ""},
 16140  		{"TCPInfo.Rttvar", Field, 1, ""},
 16141  		{"TCPInfo.Sacked", Field, 1, ""},
 16142  		{"TCPInfo.Snd_cwnd", Field, 1, ""},
 16143  		{"TCPInfo.Snd_mss", Field, 1, ""},
 16144  		{"TCPInfo.Snd_ssthresh", Field, 1, ""},
 16145  		{"TCPInfo.State", Field, 1, ""},
 16146  		{"TCPInfo.Total_retrans", Field, 1, ""},
 16147  		{"TCPInfo.Unacked", Field, 1, ""},
 16148  		{"TCPKeepalive", Type, 3, ""},
 16149  		{"TCPKeepalive.Interval", Field, 3, ""},
 16150  		{"TCPKeepalive.OnOff", Field, 3, ""},
 16151  		{"TCPKeepalive.Time", Field, 3, ""},
 16152  		{"TCP_CA_NAME_MAX", Const, 0, ""},
 16153  		{"TCP_CONGCTL", Const, 1, ""},
 16154  		{"TCP_CONGESTION", Const, 0, ""},
 16155  		{"TCP_CONNECTIONTIMEOUT", Const, 0, ""},
 16156  		{"TCP_CORK", Const, 0, ""},
 16157  		{"TCP_DEFER_ACCEPT", Const, 0, ""},
 16158  		{"TCP_ENABLE_ECN", Const, 16, ""},
 16159  		{"TCP_INFO", Const, 0, ""},
 16160  		{"TCP_KEEPALIVE", Const, 0, ""},
 16161  		{"TCP_KEEPCNT", Const, 0, ""},
 16162  		{"TCP_KEEPIDLE", Const, 0, ""},
 16163  		{"TCP_KEEPINIT", Const, 1, ""},
 16164  		{"TCP_KEEPINTVL", Const, 0, ""},
 16165  		{"TCP_LINGER2", Const, 0, ""},
 16166  		{"TCP_MAXBURST", Const, 0, ""},
 16167  		{"TCP_MAXHLEN", Const, 0, ""},
 16168  		{"TCP_MAXOLEN", Const, 0, ""},
 16169  		{"TCP_MAXSEG", Const, 0, ""},
 16170  		{"TCP_MAXWIN", Const, 0, ""},
 16171  		{"TCP_MAX_SACK", Const, 0, ""},
 16172  		{"TCP_MAX_WINSHIFT", Const, 0, ""},
 16173  		{"TCP_MD5SIG", Const, 0, ""},
 16174  		{"TCP_MD5SIG_MAXKEYLEN", Const, 0, ""},
 16175  		{"TCP_MINMSS", Const, 0, ""},
 16176  		{"TCP_MINMSSOVERLOAD", Const, 0, ""},
 16177  		{"TCP_MSS", Const, 0, ""},
 16178  		{"TCP_NODELAY", Const, 0, ""},
 16179  		{"TCP_NOOPT", Const, 0, ""},
 16180  		{"TCP_NOPUSH", Const, 0, ""},
 16181  		{"TCP_NOTSENT_LOWAT", Const, 16, ""},
 16182  		{"TCP_NSTATES", Const, 1, ""},
 16183  		{"TCP_QUICKACK", Const, 0, ""},
 16184  		{"TCP_RXT_CONNDROPTIME", Const, 0, ""},
 16185  		{"TCP_RXT_FINDROP", Const, 0, ""},
 16186  		{"TCP_SACK_ENABLE", Const, 1, ""},
 16187  		{"TCP_SENDMOREACKS", Const, 16, ""},
 16188  		{"TCP_SYNCNT", Const, 0, ""},
 16189  		{"TCP_VENDOR", Const, 3, ""},
 16190  		{"TCP_WINDOW_CLAMP", Const, 0, ""},
 16191  		{"TCSAFLUSH", Const, 1, ""},
 16192  		{"TCSETS", Const, 0, ""},
 16193  		{"TF_DISCONNECT", Const, 0, ""},
 16194  		{"TF_REUSE_SOCKET", Const, 0, ""},
 16195  		{"TF_USE_DEFAULT_WORKER", Const, 0, ""},
 16196  		{"TF_USE_KERNEL_APC", Const, 0, ""},
 16197  		{"TF_USE_SYSTEM_THREAD", Const, 0, ""},
 16198  		{"TF_WRITE_BEHIND", Const, 0, ""},
 16199  		{"TH32CS_INHERIT", Const, 4, ""},
 16200  		{"TH32CS_SNAPALL", Const, 4, ""},
 16201  		{"TH32CS_SNAPHEAPLIST", Const, 4, ""},
 16202  		{"TH32CS_SNAPMODULE", Const, 4, ""},
 16203  		{"TH32CS_SNAPMODULE32", Const, 4, ""},
 16204  		{"TH32CS_SNAPPROCESS", Const, 4, ""},
 16205  		{"TH32CS_SNAPTHREAD", Const, 4, ""},
 16206  		{"TIME_ZONE_ID_DAYLIGHT", Const, 0, ""},
 16207  		{"TIME_ZONE_ID_STANDARD", Const, 0, ""},
 16208  		{"TIME_ZONE_ID_UNKNOWN", Const, 0, ""},
 16209  		{"TIOCCBRK", Const, 0, ""},
 16210  		{"TIOCCDTR", Const, 0, ""},
 16211  		{"TIOCCONS", Const, 0, ""},
 16212  		{"TIOCDCDTIMESTAMP", Const, 0, ""},
 16213  		{"TIOCDRAIN", Const, 0, ""},
 16214  		{"TIOCDSIMICROCODE", Const, 0, ""},
 16215  		{"TIOCEXCL", Const, 0, ""},
 16216  		{"TIOCEXT", Const, 0, ""},
 16217  		{"TIOCFLAG_CDTRCTS", Const, 1, ""},
 16218  		{"TIOCFLAG_CLOCAL", Const, 1, ""},
 16219  		{"TIOCFLAG_CRTSCTS", Const, 1, ""},
 16220  		{"TIOCFLAG_MDMBUF", Const, 1, ""},
 16221  		{"TIOCFLAG_PPS", Const, 1, ""},
 16222  		{"TIOCFLAG_SOFTCAR", Const, 1, ""},
 16223  		{"TIOCFLUSH", Const, 0, ""},
 16224  		{"TIOCGDEV", Const, 0, ""},
 16225  		{"TIOCGDRAINWAIT", Const, 0, ""},
 16226  		{"TIOCGETA", Const, 0, ""},
 16227  		{"TIOCGETD", Const, 0, ""},
 16228  		{"TIOCGFLAGS", Const, 1, ""},
 16229  		{"TIOCGICOUNT", Const, 0, ""},
 16230  		{"TIOCGLCKTRMIOS", Const, 0, ""},
 16231  		{"TIOCGLINED", Const, 1, ""},
 16232  		{"TIOCGPGRP", Const, 0, ""},
 16233  		{"TIOCGPTN", Const, 0, ""},
 16234  		{"TIOCGQSIZE", Const, 1, ""},
 16235  		{"TIOCGRANTPT", Const, 1, ""},
 16236  		{"TIOCGRS485", Const, 0, ""},
 16237  		{"TIOCGSERIAL", Const, 0, ""},
 16238  		{"TIOCGSID", Const, 0, ""},
 16239  		{"TIOCGSIZE", Const, 1, ""},
 16240  		{"TIOCGSOFTCAR", Const, 0, ""},
 16241  		{"TIOCGTSTAMP", Const, 1, ""},
 16242  		{"TIOCGWINSZ", Const, 0, ""},
 16243  		{"TIOCINQ", Const, 0, ""},
 16244  		{"TIOCIXOFF", Const, 0, ""},
 16245  		{"TIOCIXON", Const, 0, ""},
 16246  		{"TIOCLINUX", Const, 0, ""},
 16247  		{"TIOCMBIC", Const, 0, ""},
 16248  		{"TIOCMBIS", Const, 0, ""},
 16249  		{"TIOCMGDTRWAIT", Const, 0, ""},
 16250  		{"TIOCMGET", Const, 0, ""},
 16251  		{"TIOCMIWAIT", Const, 0, ""},
 16252  		{"TIOCMODG", Const, 0, ""},
 16253  		{"TIOCMODS", Const, 0, ""},
 16254  		{"TIOCMSDTRWAIT", Const, 0, ""},
 16255  		{"TIOCMSET", Const, 0, ""},
 16256  		{"TIOCM_CAR", Const, 0, ""},
 16257  		{"TIOCM_CD", Const, 0, ""},
 16258  		{"TIOCM_CTS", Const, 0, ""},
 16259  		{"TIOCM_DCD", Const, 0, ""},
 16260  		{"TIOCM_DSR", Const, 0, ""},
 16261  		{"TIOCM_DTR", Const, 0, ""},
 16262  		{"TIOCM_LE", Const, 0, ""},
 16263  		{"TIOCM_RI", Const, 0, ""},
 16264  		{"TIOCM_RNG", Const, 0, ""},
 16265  		{"TIOCM_RTS", Const, 0, ""},
 16266  		{"TIOCM_SR", Const, 0, ""},
 16267  		{"TIOCM_ST", Const, 0, ""},
 16268  		{"TIOCNOTTY", Const, 0, ""},
 16269  		{"TIOCNXCL", Const, 0, ""},
 16270  		{"TIOCOUTQ", Const, 0, ""},
 16271  		{"TIOCPKT", Const, 0, ""},
 16272  		{"TIOCPKT_DATA", Const, 0, ""},
 16273  		{"TIOCPKT_DOSTOP", Const, 0, ""},
 16274  		{"TIOCPKT_FLUSHREAD", Const, 0, ""},
 16275  		{"TIOCPKT_FLUSHWRITE", Const, 0, ""},
 16276  		{"TIOCPKT_IOCTL", Const, 0, ""},
 16277  		{"TIOCPKT_NOSTOP", Const, 0, ""},
 16278  		{"TIOCPKT_START", Const, 0, ""},
 16279  		{"TIOCPKT_STOP", Const, 0, ""},
 16280  		{"TIOCPTMASTER", Const, 0, ""},
 16281  		{"TIOCPTMGET", Const, 1, ""},
 16282  		{"TIOCPTSNAME", Const, 1, ""},
 16283  		{"TIOCPTYGNAME", Const, 0, ""},
 16284  		{"TIOCPTYGRANT", Const, 0, ""},
 16285  		{"TIOCPTYUNLK", Const, 0, ""},
 16286  		{"TIOCRCVFRAME", Const, 1, ""},
 16287  		{"TIOCREMOTE", Const, 0, ""},
 16288  		{"TIOCSBRK", Const, 0, ""},
 16289  		{"TIOCSCONS", Const, 0, ""},
 16290  		{"TIOCSCTTY", Const, 0, ""},
 16291  		{"TIOCSDRAINWAIT", Const, 0, ""},
 16292  		{"TIOCSDTR", Const, 0, ""},
 16293  		{"TIOCSERCONFIG", Const, 0, ""},
 16294  		{"TIOCSERGETLSR", Const, 0, ""},
 16295  		{"TIOCSERGETMULTI", Const, 0, ""},
 16296  		{"TIOCSERGSTRUCT", Const, 0, ""},
 16297  		{"TIOCSERGWILD", Const, 0, ""},
 16298  		{"TIOCSERSETMULTI", Const, 0, ""},
 16299  		{"TIOCSERSWILD", Const, 0, ""},
 16300  		{"TIOCSER_TEMT", Const, 0, ""},
 16301  		{"TIOCSETA", Const, 0, ""},
 16302  		{"TIOCSETAF", Const, 0, ""},
 16303  		{"TIOCSETAW", Const, 0, ""},
 16304  		{"TIOCSETD", Const, 0, ""},
 16305  		{"TIOCSFLAGS", Const, 1, ""},
 16306  		{"TIOCSIG", Const, 0, ""},
 16307  		{"TIOCSLCKTRMIOS", Const, 0, ""},
 16308  		{"TIOCSLINED", Const, 1, ""},
 16309  		{"TIOCSPGRP", Const, 0, ""},
 16310  		{"TIOCSPTLCK", Const, 0, ""},
 16311  		{"TIOCSQSIZE", Const, 1, ""},
 16312  		{"TIOCSRS485", Const, 0, ""},
 16313  		{"TIOCSSERIAL", Const, 0, ""},
 16314  		{"TIOCSSIZE", Const, 1, ""},
 16315  		{"TIOCSSOFTCAR", Const, 0, ""},
 16316  		{"TIOCSTART", Const, 0, ""},
 16317  		{"TIOCSTAT", Const, 0, ""},
 16318  		{"TIOCSTI", Const, 0, ""},
 16319  		{"TIOCSTOP", Const, 0, ""},
 16320  		{"TIOCSTSTAMP", Const, 1, ""},
 16321  		{"TIOCSWINSZ", Const, 0, ""},
 16322  		{"TIOCTIMESTAMP", Const, 0, ""},
 16323  		{"TIOCUCNTL", Const, 0, ""},
 16324  		{"TIOCVHANGUP", Const, 0, ""},
 16325  		{"TIOCXMTFRAME", Const, 1, ""},
 16326  		{"TOKEN_ADJUST_DEFAULT", Const, 0, ""},
 16327  		{"TOKEN_ADJUST_GROUPS", Const, 0, ""},
 16328  		{"TOKEN_ADJUST_PRIVILEGES", Const, 0, ""},
 16329  		{"TOKEN_ADJUST_SESSIONID", Const, 11, ""},
 16330  		{"TOKEN_ALL_ACCESS", Const, 0, ""},
 16331  		{"TOKEN_ASSIGN_PRIMARY", Const, 0, ""},
 16332  		{"TOKEN_DUPLICATE", Const, 0, ""},
 16333  		{"TOKEN_EXECUTE", Const, 0, ""},
 16334  		{"TOKEN_IMPERSONATE", Const, 0, ""},
 16335  		{"TOKEN_QUERY", Const, 0, ""},
 16336  		{"TOKEN_QUERY_SOURCE", Const, 0, ""},
 16337  		{"TOKEN_READ", Const, 0, ""},
 16338  		{"TOKEN_WRITE", Const, 0, ""},
 16339  		{"TOSTOP", Const, 0, ""},
 16340  		{"TRUNCATE_EXISTING", Const, 0, ""},
 16341  		{"TUNATTACHFILTER", Const, 0, ""},
 16342  		{"TUNDETACHFILTER", Const, 0, ""},
 16343  		{"TUNGETFEATURES", Const, 0, ""},
 16344  		{"TUNGETIFF", Const, 0, ""},
 16345  		{"TUNGETSNDBUF", Const, 0, ""},
 16346  		{"TUNGETVNETHDRSZ", Const, 0, ""},
 16347  		{"TUNSETDEBUG", Const, 0, ""},
 16348  		{"TUNSETGROUP", Const, 0, ""},
 16349  		{"TUNSETIFF", Const, 0, ""},
 16350  		{"TUNSETLINK", Const, 0, ""},
 16351  		{"TUNSETNOCSUM", Const, 0, ""},
 16352  		{"TUNSETOFFLOAD", Const, 0, ""},
 16353  		{"TUNSETOWNER", Const, 0, ""},
 16354  		{"TUNSETPERSIST", Const, 0, ""},
 16355  		{"TUNSETSNDBUF", Const, 0, ""},
 16356  		{"TUNSETTXFILTER", Const, 0, ""},
 16357  		{"TUNSETVNETHDRSZ", Const, 0, ""},
 16358  		{"Tee", Func, 0, "func(rfd int, wfd int, len int, flags int) (n int64, err error)"},
 16359  		{"TerminateProcess", Func, 0, ""},
 16360  		{"Termios", Type, 0, ""},
 16361  		{"Termios.Cc", Field, 0, ""},
 16362  		{"Termios.Cflag", Field, 0, ""},
 16363  		{"Termios.Iflag", Field, 0, ""},
 16364  		{"Termios.Ispeed", Field, 0, ""},
 16365  		{"Termios.Lflag", Field, 0, ""},
 16366  		{"Termios.Line", Field, 0, ""},
 16367  		{"Termios.Oflag", Field, 0, ""},
 16368  		{"Termios.Ospeed", Field, 0, ""},
 16369  		{"Termios.Pad_cgo_0", Field, 0, ""},
 16370  		{"Tgkill", Func, 0, "func(tgid int, tid int, sig Signal) (err error)"},
 16371  		{"Time", Func, 0, "func(t *Time_t) (tt Time_t, err error)"},
 16372  		{"Time_t", Type, 0, ""},
 16373  		{"Times", Func, 0, "func(tms *Tms) (ticks uintptr, err error)"},
 16374  		{"Timespec", Type, 0, ""},
 16375  		{"Timespec.Nsec", Field, 0, ""},
 16376  		{"Timespec.Pad_cgo_0", Field, 2, ""},
 16377  		{"Timespec.Sec", Field, 0, ""},
 16378  		{"TimespecToNsec", Func, 0, "func(ts Timespec) int64"},
 16379  		{"Timeval", Type, 0, ""},
 16380  		{"Timeval.Pad_cgo_0", Field, 0, ""},
 16381  		{"Timeval.Sec", Field, 0, ""},
 16382  		{"Timeval.Usec", Field, 0, ""},
 16383  		{"Timeval32", Type, 0, ""},
 16384  		{"Timeval32.Sec", Field, 0, ""},
 16385  		{"Timeval32.Usec", Field, 0, ""},
 16386  		{"TimevalToNsec", Func, 0, "func(tv Timeval) int64"},
 16387  		{"Timex", Type, 0, ""},
 16388  		{"Timex.Calcnt", Field, 0, ""},
 16389  		{"Timex.Constant", Field, 0, ""},
 16390  		{"Timex.Errcnt", Field, 0, ""},
 16391  		{"Timex.Esterror", Field, 0, ""},
 16392  		{"Timex.Freq", Field, 0, ""},
 16393  		{"Timex.Jitcnt", Field, 0, ""},
 16394  		{"Timex.Jitter", Field, 0, ""},
 16395  		{"Timex.Maxerror", Field, 0, ""},
 16396  		{"Timex.Modes", Field, 0, ""},
 16397  		{"Timex.Offset", Field, 0, ""},
 16398  		{"Timex.Pad_cgo_0", Field, 0, ""},
 16399  		{"Timex.Pad_cgo_1", Field, 0, ""},
 16400  		{"Timex.Pad_cgo_2", Field, 0, ""},
 16401  		{"Timex.Pad_cgo_3", Field, 0, ""},
 16402  		{"Timex.Ppsfreq", Field, 0, ""},
 16403  		{"Timex.Precision", Field, 0, ""},
 16404  		{"Timex.Shift", Field, 0, ""},
 16405  		{"Timex.Stabil", Field, 0, ""},
 16406  		{"Timex.Status", Field, 0, ""},
 16407  		{"Timex.Stbcnt", Field, 0, ""},
 16408  		{"Timex.Tai", Field, 0, ""},
 16409  		{"Timex.Tick", Field, 0, ""},
 16410  		{"Timex.Time", Field, 0, ""},
 16411  		{"Timex.Tolerance", Field, 0, ""},
 16412  		{"Timezoneinformation", Type, 0, ""},
 16413  		{"Timezoneinformation.Bias", Field, 0, ""},
 16414  		{"Timezoneinformation.DaylightBias", Field, 0, ""},
 16415  		{"Timezoneinformation.DaylightDate", Field, 0, ""},
 16416  		{"Timezoneinformation.DaylightName", Field, 0, ""},
 16417  		{"Timezoneinformation.StandardBias", Field, 0, ""},
 16418  		{"Timezoneinformation.StandardDate", Field, 0, ""},
 16419  		{"Timezoneinformation.StandardName", Field, 0, ""},
 16420  		{"Tms", Type, 0, ""},
 16421  		{"Tms.Cstime", Field, 0, ""},
 16422  		{"Tms.Cutime", Field, 0, ""},
 16423  		{"Tms.Stime", Field, 0, ""},
 16424  		{"Tms.Utime", Field, 0, ""},
 16425  		{"Token", Type, 0, ""},
 16426  		{"TokenAccessInformation", Const, 0, ""},
 16427  		{"TokenAuditPolicy", Const, 0, ""},
 16428  		{"TokenDefaultDacl", Const, 0, ""},
 16429  		{"TokenElevation", Const, 0, ""},
 16430  		{"TokenElevationType", Const, 0, ""},
 16431  		{"TokenGroups", Const, 0, ""},
 16432  		{"TokenGroupsAndPrivileges", Const, 0, ""},
 16433  		{"TokenHasRestrictions", Const, 0, ""},
 16434  		{"TokenImpersonationLevel", Const, 0, ""},
 16435  		{"TokenIntegrityLevel", Const, 0, ""},
 16436  		{"TokenLinkedToken", Const, 0, ""},
 16437  		{"TokenLogonSid", Const, 0, ""},
 16438  		{"TokenMandatoryPolicy", Const, 0, ""},
 16439  		{"TokenOrigin", Const, 0, ""},
 16440  		{"TokenOwner", Const, 0, ""},
 16441  		{"TokenPrimaryGroup", Const, 0, ""},
 16442  		{"TokenPrivileges", Const, 0, ""},
 16443  		{"TokenRestrictedSids", Const, 0, ""},
 16444  		{"TokenSandBoxInert", Const, 0, ""},
 16445  		{"TokenSessionId", Const, 0, ""},
 16446  		{"TokenSessionReference", Const, 0, ""},
 16447  		{"TokenSource", Const, 0, ""},
 16448  		{"TokenStatistics", Const, 0, ""},
 16449  		{"TokenType", Const, 0, ""},
 16450  		{"TokenUIAccess", Const, 0, ""},
 16451  		{"TokenUser", Const, 0, ""},
 16452  		{"TokenVirtualizationAllowed", Const, 0, ""},
 16453  		{"TokenVirtualizationEnabled", Const, 0, ""},
 16454  		{"Tokenprimarygroup", Type, 0, ""},
 16455  		{"Tokenprimarygroup.PrimaryGroup", Field, 0, ""},
 16456  		{"Tokenuser", Type, 0, ""},
 16457  		{"Tokenuser.User", Field, 0, ""},
 16458  		{"TranslateAccountName", Func, 0, ""},
 16459  		{"TranslateName", Func, 0, ""},
 16460  		{"TransmitFile", Func, 0, ""},
 16461  		{"TransmitFileBuffers", Type, 0, ""},
 16462  		{"TransmitFileBuffers.Head", Field, 0, ""},
 16463  		{"TransmitFileBuffers.HeadLength", Field, 0, ""},
 16464  		{"TransmitFileBuffers.Tail", Field, 0, ""},
 16465  		{"TransmitFileBuffers.TailLength", Field, 0, ""},
 16466  		{"Truncate", Func, 0, "func(path string, length int64) (err error)"},
 16467  		{"UNIX_PATH_MAX", Const, 12, ""},
 16468  		{"USAGE_MATCH_TYPE_AND", Const, 0, ""},
 16469  		{"USAGE_MATCH_TYPE_OR", Const, 0, ""},
 16470  		{"UTF16FromString", Func, 1, ""},
 16471  		{"UTF16PtrFromString", Func, 1, ""},
 16472  		{"UTF16ToString", Func, 0, ""},
 16473  		{"Ucred", Type, 0, ""},
 16474  		{"Ucred.Gid", Field, 0, ""},
 16475  		{"Ucred.Pid", Field, 0, ""},
 16476  		{"Ucred.Uid", Field, 0, ""},
 16477  		{"Umask", Func, 0, "func(mask int) (oldmask int)"},
 16478  		{"Uname", Func, 0, "func(buf *Utsname) (err error)"},
 16479  		{"Undelete", Func, 0, ""},
 16480  		{"UnixCredentials", Func, 0, "func(ucred *Ucred) []byte"},
 16481  		{"UnixRights", Func, 0, "func(fds ...int) []byte"},
 16482  		{"Unlink", Func, 0, "func(path string) error"},
 16483  		{"Unlinkat", Func, 0, "func(dirfd int, path string) error"},
 16484  		{"UnmapViewOfFile", Func, 0, ""},
 16485  		{"Unmount", Func, 0, "func(target string, flags int) (err error)"},
 16486  		{"Unsetenv", Func, 4, "func(key string) error"},
 16487  		{"Unshare", Func, 0, "func(flags int) (err error)"},
 16488  		{"UserInfo10", Type, 0, ""},
 16489  		{"UserInfo10.Comment", Field, 0, ""},
 16490  		{"UserInfo10.FullName", Field, 0, ""},
 16491  		{"UserInfo10.Name", Field, 0, ""},
 16492  		{"UserInfo10.UsrComment", Field, 0, ""},
 16493  		{"Ustat", Func, 0, "func(dev int, ubuf *Ustat_t) (err error)"},
 16494  		{"Ustat_t", Type, 0, ""},
 16495  		{"Ustat_t.Fname", Field, 0, ""},
 16496  		{"Ustat_t.Fpack", Field, 0, ""},
 16497  		{"Ustat_t.Pad_cgo_0", Field, 0, ""},
 16498  		{"Ustat_t.Pad_cgo_1", Field, 0, ""},
 16499  		{"Ustat_t.Tfree", Field, 0, ""},
 16500  		{"Ustat_t.Tinode", Field, 0, ""},
 16501  		{"Utimbuf", Type, 0, ""},
 16502  		{"Utimbuf.Actime", Field, 0, ""},
 16503  		{"Utimbuf.Modtime", Field, 0, ""},
 16504  		{"Utime", Func, 0, "func(path string, buf *Utimbuf) (err error)"},
 16505  		{"Utimes", Func, 0, "func(path string, tv []Timeval) (err error)"},
 16506  		{"UtimesNano", Func, 1, "func(path string, ts []Timespec) (err error)"},
 16507  		{"Utsname", Type, 0, ""},
 16508  		{"Utsname.Domainname", Field, 0, ""},
 16509  		{"Utsname.Machine", Field, 0, ""},
 16510  		{"Utsname.Nodename", Field, 0, ""},
 16511  		{"Utsname.Release", Field, 0, ""},
 16512  		{"Utsname.Sysname", Field, 0, ""},
 16513  		{"Utsname.Version", Field, 0, ""},
 16514  		{"VDISCARD", Const, 0, ""},
 16515  		{"VDSUSP", Const, 1, ""},
 16516  		{"VEOF", Const, 0, ""},
 16517  		{"VEOL", Const, 0, ""},
 16518  		{"VEOL2", Const, 0, ""},
 16519  		{"VERASE", Const, 0, ""},
 16520  		{"VERASE2", Const, 1, ""},
 16521  		{"VINTR", Const, 0, ""},
 16522  		{"VKILL", Const, 0, ""},
 16523  		{"VLNEXT", Const, 0, ""},
 16524  		{"VMIN", Const, 0, ""},
 16525  		{"VQUIT", Const, 0, ""},
 16526  		{"VREPRINT", Const, 0, ""},
 16527  		{"VSTART", Const, 0, ""},
 16528  		{"VSTATUS", Const, 1, ""},
 16529  		{"VSTOP", Const, 0, ""},
 16530  		{"VSUSP", Const, 0, ""},
 16531  		{"VSWTC", Const, 0, ""},
 16532  		{"VT0", Const, 1, ""},
 16533  		{"VT1", Const, 1, ""},
 16534  		{"VTDLY", Const, 1, ""},
 16535  		{"VTIME", Const, 0, ""},
 16536  		{"VWERASE", Const, 0, ""},
 16537  		{"VirtualLock", Func, 0, ""},
 16538  		{"VirtualUnlock", Func, 0, ""},
 16539  		{"WAIT_ABANDONED", Const, 0, ""},
 16540  		{"WAIT_FAILED", Const, 0, ""},
 16541  		{"WAIT_OBJECT_0", Const, 0, ""},
 16542  		{"WAIT_TIMEOUT", Const, 0, ""},
 16543  		{"WALL", Const, 0, ""},
 16544  		{"WALLSIG", Const, 1, ""},
 16545  		{"WALTSIG", Const, 1, ""},
 16546  		{"WCLONE", Const, 0, ""},
 16547  		{"WCONTINUED", Const, 0, ""},
 16548  		{"WCOREFLAG", Const, 0, ""},
 16549  		{"WEXITED", Const, 0, ""},
 16550  		{"WLINUXCLONE", Const, 0, ""},
 16551  		{"WNOHANG", Const, 0, ""},
 16552  		{"WNOTHREAD", Const, 0, ""},
 16553  		{"WNOWAIT", Const, 0, ""},
 16554  		{"WNOZOMBIE", Const, 1, ""},
 16555  		{"WOPTSCHECKED", Const, 1, ""},
 16556  		{"WORDSIZE", Const, 0, ""},
 16557  		{"WSABuf", Type, 0, ""},
 16558  		{"WSABuf.Buf", Field, 0, ""},
 16559  		{"WSABuf.Len", Field, 0, ""},
 16560  		{"WSACleanup", Func, 0, ""},
 16561  		{"WSADESCRIPTION_LEN", Const, 0, ""},
 16562  		{"WSAData", Type, 0, ""},
 16563  		{"WSAData.Description", Field, 0, ""},
 16564  		{"WSAData.HighVersion", Field, 0, ""},
 16565  		{"WSAData.MaxSockets", Field, 0, ""},
 16566  		{"WSAData.MaxUdpDg", Field, 0, ""},
 16567  		{"WSAData.SystemStatus", Field, 0, ""},
 16568  		{"WSAData.VendorInfo", Field, 0, ""},
 16569  		{"WSAData.Version", Field, 0, ""},
 16570  		{"WSAEACCES", Const, 2, ""},
 16571  		{"WSAECONNABORTED", Const, 9, ""},
 16572  		{"WSAECONNRESET", Const, 3, ""},
 16573  		{"WSAENOPROTOOPT", Const, 23, ""},
 16574  		{"WSAEnumProtocols", Func, 2, ""},
 16575  		{"WSAID_CONNECTEX", Var, 1, ""},
 16576  		{"WSAIoctl", Func, 0, ""},
 16577  		{"WSAPROTOCOL_LEN", Const, 2, ""},
 16578  		{"WSAProtocolChain", Type, 2, ""},
 16579  		{"WSAProtocolChain.ChainEntries", Field, 2, ""},
 16580  		{"WSAProtocolChain.ChainLen", Field, 2, ""},
 16581  		{"WSAProtocolInfo", Type, 2, ""},
 16582  		{"WSAProtocolInfo.AddressFamily", Field, 2, ""},
 16583  		{"WSAProtocolInfo.CatalogEntryId", Field, 2, ""},
 16584  		{"WSAProtocolInfo.MaxSockAddr", Field, 2, ""},
 16585  		{"WSAProtocolInfo.MessageSize", Field, 2, ""},
 16586  		{"WSAProtocolInfo.MinSockAddr", Field, 2, ""},
 16587  		{"WSAProtocolInfo.NetworkByteOrder", Field, 2, ""},
 16588  		{"WSAProtocolInfo.Protocol", Field, 2, ""},
 16589  		{"WSAProtocolInfo.ProtocolChain", Field, 2, ""},
 16590  		{"WSAProtocolInfo.ProtocolMaxOffset", Field, 2, ""},
 16591  		{"WSAProtocolInfo.ProtocolName", Field, 2, ""},
 16592  		{"WSAProtocolInfo.ProviderFlags", Field, 2, ""},
 16593  		{"WSAProtocolInfo.ProviderId", Field, 2, ""},
 16594  		{"WSAProtocolInfo.ProviderReserved", Field, 2, ""},
 16595  		{"WSAProtocolInfo.SecurityScheme", Field, 2, ""},
 16596  		{"WSAProtocolInfo.ServiceFlags1", Field, 2, ""},
 16597  		{"WSAProtocolInfo.ServiceFlags2", Field, 2, ""},
 16598  		{"WSAProtocolInfo.ServiceFlags3", Field, 2, ""},
 16599  		{"WSAProtocolInfo.ServiceFlags4", Field, 2, ""},
 16600  		{"WSAProtocolInfo.SocketType", Field, 2, ""},
 16601  		{"WSAProtocolInfo.Version", Field, 2, ""},
 16602  		{"WSARecv", Func, 0, ""},
 16603  		{"WSARecvFrom", Func, 0, ""},
 16604  		{"WSASYS_STATUS_LEN", Const, 0, ""},
 16605  		{"WSASend", Func, 0, ""},
 16606  		{"WSASendTo", Func, 0, ""},
 16607  		{"WSASendto", Func, 0, ""},
 16608  		{"WSAStartup", Func, 0, ""},
 16609  		{"WSTOPPED", Const, 0, ""},
 16610  		{"WTRAPPED", Const, 1, ""},
 16611  		{"WUNTRACED", Const, 0, ""},
 16612  		{"Wait4", Func, 0, "func(pid int, wstatus *WaitStatus, options int, rusage *Rusage) (wpid int, err error)"},
 16613  		{"WaitForSingleObject", Func, 0, ""},
 16614  		{"WaitStatus", Type, 0, ""},
 16615  		{"WaitStatus.ExitCode", Field, 0, ""},
 16616  		{"Win32FileAttributeData", Type, 0, ""},
 16617  		{"Win32FileAttributeData.CreationTime", Field, 0, ""},
 16618  		{"Win32FileAttributeData.FileAttributes", Field, 0, ""},
 16619  		{"Win32FileAttributeData.FileSizeHigh", Field, 0, ""},
 16620  		{"Win32FileAttributeData.FileSizeLow", Field, 0, ""},
 16621  		{"Win32FileAttributeData.LastAccessTime", Field, 0, ""},
 16622  		{"Win32FileAttributeData.LastWriteTime", Field, 0, ""},
 16623  		{"Win32finddata", Type, 0, ""},
 16624  		{"Win32finddata.AlternateFileName", Field, 0, ""},
 16625  		{"Win32finddata.CreationTime", Field, 0, ""},
 16626  		{"Win32finddata.FileAttributes", Field, 0, ""},
 16627  		{"Win32finddata.FileName", Field, 0, ""},
 16628  		{"Win32finddata.FileSizeHigh", Field, 0, ""},
 16629  		{"Win32finddata.FileSizeLow", Field, 0, ""},
 16630  		{"Win32finddata.LastAccessTime", Field, 0, ""},
 16631  		{"Win32finddata.LastWriteTime", Field, 0, ""},
 16632  		{"Win32finddata.Reserved0", Field, 0, ""},
 16633  		{"Win32finddata.Reserved1", Field, 0, ""},
 16634  		{"Write", Func, 0, "func(fd int, p []byte) (n int, err error)"},
 16635  		{"WriteConsole", Func, 1, ""},
 16636  		{"WriteFile", Func, 0, ""},
 16637  		{"X509_ASN_ENCODING", Const, 0, ""},
 16638  		{"XCASE", Const, 0, ""},
 16639  		{"XP1_CONNECTIONLESS", Const, 2, ""},
 16640  		{"XP1_CONNECT_DATA", Const, 2, ""},
 16641  		{"XP1_DISCONNECT_DATA", Const, 2, ""},
 16642  		{"XP1_EXPEDITED_DATA", Const, 2, ""},
 16643  		{"XP1_GRACEFUL_CLOSE", Const, 2, ""},
 16644  		{"XP1_GUARANTEED_DELIVERY", Const, 2, ""},
 16645  		{"XP1_GUARANTEED_ORDER", Const, 2, ""},
 16646  		{"XP1_IFS_HANDLES", Const, 2, ""},
 16647  		{"XP1_MESSAGE_ORIENTED", Const, 2, ""},
 16648  		{"XP1_MULTIPOINT_CONTROL_PLANE", Const, 2, ""},
 16649  		{"XP1_MULTIPOINT_DATA_PLANE", Const, 2, ""},
 16650  		{"XP1_PARTIAL_MESSAGE", Const, 2, ""},
 16651  		{"XP1_PSEUDO_STREAM", Const, 2, ""},
 16652  		{"XP1_QOS_SUPPORTED", Const, 2, ""},
 16653  		{"XP1_SAN_SUPPORT_SDP", Const, 2, ""},
 16654  		{"XP1_SUPPORT_BROADCAST", Const, 2, ""},
 16655  		{"XP1_SUPPORT_MULTIPOINT", Const, 2, ""},
 16656  		{"XP1_UNI_RECV", Const, 2, ""},
 16657  		{"XP1_UNI_SEND", Const, 2, ""},
 16658  	},
 16659  	"syscall/js": {
 16660  		{"CopyBytesToGo", Func, 0, ""},
 16661  		{"CopyBytesToJS", Func, 0, ""},
 16662  		{"Error", Type, 0, ""},
 16663  		{"Func", Type, 0, ""},
 16664  		{"FuncOf", Func, 0, ""},
 16665  		{"Global", Func, 0, ""},
 16666  		{"Null", Func, 0, ""},
 16667  		{"Type", Type, 0, ""},
 16668  		{"TypeBoolean", Const, 0, ""},
 16669  		{"TypeFunction", Const, 0, ""},
 16670  		{"TypeNull", Const, 0, ""},
 16671  		{"TypeNumber", Const, 0, ""},
 16672  		{"TypeObject", Const, 0, ""},
 16673  		{"TypeString", Const, 0, ""},
 16674  		{"TypeSymbol", Const, 0, ""},
 16675  		{"TypeUndefined", Const, 0, ""},
 16676  		{"Undefined", Func, 0, ""},
 16677  		{"Value", Type, 0, ""},
 16678  		{"ValueError", Type, 0, ""},
 16679  		{"ValueOf", Func, 0, ""},
 16680  	},
 16681  	"testing": {
 16682  		{"(*B).Attr", Method, 25, ""},
 16683  		{"(*B).Chdir", Method, 24, ""},
 16684  		{"(*B).Cleanup", Method, 14, ""},
 16685  		{"(*B).Context", Method, 24, ""},
 16686  		{"(*B).Elapsed", Method, 20, ""},
 16687  		{"(*B).Error", Method, 0, ""},
 16688  		{"(*B).Errorf", Method, 0, ""},
 16689  		{"(*B).Fail", Method, 0, ""},
 16690  		{"(*B).FailNow", Method, 0, ""},
 16691  		{"(*B).Failed", Method, 0, ""},
 16692  		{"(*B).Fatal", Method, 0, ""},
 16693  		{"(*B).Fatalf", Method, 0, ""},
 16694  		{"(*B).Helper", Method, 9, ""},
 16695  		{"(*B).Log", Method, 0, ""},
 16696  		{"(*B).Logf", Method, 0, ""},
 16697  		{"(*B).Loop", Method, 24, ""},
 16698  		{"(*B).Name", Method, 8, ""},
 16699  		{"(*B).Output", Method, 25, ""},
 16700  		{"(*B).ReportAllocs", Method, 1, ""},
 16701  		{"(*B).ReportMetric", Method, 13, ""},
 16702  		{"(*B).ResetTimer", Method, 0, ""},
 16703  		{"(*B).Run", Method, 7, ""},
 16704  		{"(*B).RunParallel", Method, 3, ""},
 16705  		{"(*B).SetBytes", Method, 0, ""},
 16706  		{"(*B).SetParallelism", Method, 3, ""},
 16707  		{"(*B).Setenv", Method, 17, ""},
 16708  		{"(*B).Skip", Method, 1, ""},
 16709  		{"(*B).SkipNow", Method, 1, ""},
 16710  		{"(*B).Skipf", Method, 1, ""},
 16711  		{"(*B).Skipped", Method, 1, ""},
 16712  		{"(*B).StartTimer", Method, 0, ""},
 16713  		{"(*B).StopTimer", Method, 0, ""},
 16714  		{"(*B).TempDir", Method, 15, ""},
 16715  		{"(*F).Add", Method, 18, ""},
 16716  		{"(*F).Attr", Method, 25, ""},
 16717  		{"(*F).Chdir", Method, 24, ""},
 16718  		{"(*F).Cleanup", Method, 18, ""},
 16719  		{"(*F).Context", Method, 24, ""},
 16720  		{"(*F).Error", Method, 18, ""},
 16721  		{"(*F).Errorf", Method, 18, ""},
 16722  		{"(*F).Fail", Method, 18, ""},
 16723  		{"(*F).FailNow", Method, 18, ""},
 16724  		{"(*F).Failed", Method, 18, ""},
 16725  		{"(*F).Fatal", Method, 18, ""},
 16726  		{"(*F).Fatalf", Method, 18, ""},
 16727  		{"(*F).Fuzz", Method, 18, ""},
 16728  		{"(*F).Helper", Method, 18, ""},
 16729  		{"(*F).Log", Method, 18, ""},
 16730  		{"(*F).Logf", Method, 18, ""},
 16731  		{"(*F).Name", Method, 18, ""},
 16732  		{"(*F).Output", Method, 25, ""},
 16733  		{"(*F).Setenv", Method, 18, ""},
 16734  		{"(*F).Skip", Method, 18, ""},
 16735  		{"(*F).SkipNow", Method, 18, ""},
 16736  		{"(*F).Skipf", Method, 18, ""},
 16737  		{"(*F).Skipped", Method, 18, ""},
 16738  		{"(*F).TempDir", Method, 18, ""},
 16739  		{"(*M).Run", Method, 4, ""},
 16740  		{"(*PB).Next", Method, 3, ""},
 16741  		{"(*T).Attr", Method, 25, ""},
 16742  		{"(*T).Chdir", Method, 24, ""},
 16743  		{"(*T).Cleanup", Method, 14, ""},
 16744  		{"(*T).Context", Method, 24, ""},
 16745  		{"(*T).Deadline", Method, 15, ""},
 16746  		{"(*T).Error", Method, 0, ""},
 16747  		{"(*T).Errorf", Method, 0, ""},
 16748  		{"(*T).Fail", Method, 0, ""},
 16749  		{"(*T).FailNow", Method, 0, ""},
 16750  		{"(*T).Failed", Method, 0, ""},
 16751  		{"(*T).Fatal", Method, 0, ""},
 16752  		{"(*T).Fatalf", Method, 0, ""},
 16753  		{"(*T).Helper", Method, 9, ""},
 16754  		{"(*T).Log", Method, 0, ""},
 16755  		{"(*T).Logf", Method, 0, ""},
 16756  		{"(*T).Name", Method, 8, ""},
 16757  		{"(*T).Output", Method, 25, ""},
 16758  		{"(*T).Parallel", Method, 0, ""},
 16759  		{"(*T).Run", Method, 7, ""},
 16760  		{"(*T).Setenv", Method, 17, ""},
 16761  		{"(*T).Skip", Method, 1, ""},
 16762  		{"(*T).SkipNow", Method, 1, ""},
 16763  		{"(*T).Skipf", Method, 1, ""},
 16764  		{"(*T).Skipped", Method, 1, ""},
 16765  		{"(*T).TempDir", Method, 15, ""},
 16766  		{"(BenchmarkResult).AllocedBytesPerOp", Method, 1, ""},
 16767  		{"(BenchmarkResult).AllocsPerOp", Method, 1, ""},
 16768  		{"(BenchmarkResult).MemString", Method, 1, ""},
 16769  		{"(BenchmarkResult).NsPerOp", Method, 0, ""},
 16770  		{"(BenchmarkResult).String", Method, 0, ""},
 16771  		{"AllocsPerRun", Func, 1, "func(runs int, f func()) (avg float64)"},
 16772  		{"B", Type, 0, ""},
 16773  		{"B.N", Field, 0, ""},
 16774  		{"Benchmark", Func, 0, "func(f func(b *B)) BenchmarkResult"},
 16775  		{"BenchmarkResult", Type, 0, ""},
 16776  		{"BenchmarkResult.Bytes", Field, 0, ""},
 16777  		{"BenchmarkResult.Extra", Field, 13, ""},
 16778  		{"BenchmarkResult.MemAllocs", Field, 1, ""},
 16779  		{"BenchmarkResult.MemBytes", Field, 1, ""},
 16780  		{"BenchmarkResult.N", Field, 0, ""},
 16781  		{"BenchmarkResult.T", Field, 0, ""},
 16782  		{"Cover", Type, 2, ""},
 16783  		{"Cover.Blocks", Field, 2, ""},
 16784  		{"Cover.Counters", Field, 2, ""},
 16785  		{"Cover.CoveredPackages", Field, 2, ""},
 16786  		{"Cover.Mode", Field, 2, ""},
 16787  		{"CoverBlock", Type, 2, ""},
 16788  		{"CoverBlock.Col0", Field, 2, ""},
 16789  		{"CoverBlock.Col1", Field, 2, ""},
 16790  		{"CoverBlock.Line0", Field, 2, ""},
 16791  		{"CoverBlock.Line1", Field, 2, ""},
 16792  		{"CoverBlock.Stmts", Field, 2, ""},
 16793  		{"CoverMode", Func, 8, "func() string"},
 16794  		{"Coverage", Func, 4, "func() float64"},
 16795  		{"F", Type, 18, ""},
 16796  		{"Init", Func, 13, "func()"},
 16797  		{"InternalBenchmark", Type, 0, ""},
 16798  		{"InternalBenchmark.F", Field, 0, ""},
 16799  		{"InternalBenchmark.Name", Field, 0, ""},
 16800  		{"InternalExample", Type, 0, ""},
 16801  		{"InternalExample.F", Field, 0, ""},
 16802  		{"InternalExample.Name", Field, 0, ""},
 16803  		{"InternalExample.Output", Field, 0, ""},
 16804  		{"InternalExample.Unordered", Field, 7, ""},
 16805  		{"InternalFuzzTarget", Type, 18, ""},
 16806  		{"InternalFuzzTarget.Fn", Field, 18, ""},
 16807  		{"InternalFuzzTarget.Name", Field, 18, ""},
 16808  		{"InternalTest", Type, 0, ""},
 16809  		{"InternalTest.F", Field, 0, ""},
 16810  		{"InternalTest.Name", Field, 0, ""},
 16811  		{"M", Type, 4, ""},
 16812  		{"Main", Func, 0, "func(matchString func(pat string, str string) (bool, error), tests []InternalTest, benchmarks []InternalBenchmark, examples []InternalExample)"},
 16813  		{"MainStart", Func, 4, "func(deps testDeps, tests []InternalTest, benchmarks []InternalBenchmark, fuzzTargets []InternalFuzzTarget, examples []InternalExample) *M"},
 16814  		{"PB", Type, 3, ""},
 16815  		{"RegisterCover", Func, 2, "func(c Cover)"},
 16816  		{"RunBenchmarks", Func, 0, "func(matchString func(pat string, str string) (bool, error), benchmarks []InternalBenchmark)"},
 16817  		{"RunExamples", Func, 0, "func(matchString func(pat string, str string) (bool, error), examples []InternalExample) (ok bool)"},
 16818  		{"RunTests", Func, 0, "func(matchString func(pat string, str string) (bool, error), tests []InternalTest) (ok bool)"},
 16819  		{"Short", Func, 0, "func() bool"},
 16820  		{"T", Type, 0, ""},
 16821  		{"TB", Type, 2, ""},
 16822  		{"Testing", Func, 21, "func() bool"},
 16823  		{"Verbose", Func, 1, "func() bool"},
 16824  	},
 16825  	"testing/fstest": {
 16826  		{"(MapFS).Glob", Method, 16, ""},
 16827  		{"(MapFS).Lstat", Method, 25, ""},
 16828  		{"(MapFS).Open", Method, 16, ""},
 16829  		{"(MapFS).ReadDir", Method, 16, ""},
 16830  		{"(MapFS).ReadFile", Method, 16, ""},
 16831  		{"(MapFS).ReadLink", Method, 25, ""},
 16832  		{"(MapFS).Stat", Method, 16, ""},
 16833  		{"(MapFS).Sub", Method, 16, ""},
 16834  		{"MapFS", Type, 16, ""},
 16835  		{"MapFile", Type, 16, ""},
 16836  		{"MapFile.Data", Field, 16, ""},
 16837  		{"MapFile.ModTime", Field, 16, ""},
 16838  		{"MapFile.Mode", Field, 16, ""},
 16839  		{"MapFile.Sys", Field, 16, ""},
 16840  		{"TestFS", Func, 16, "func(fsys fs.FS, expected ...string) error"},
 16841  	},
 16842  	"testing/iotest": {
 16843  		{"DataErrReader", Func, 0, "func(r io.Reader) io.Reader"},
 16844  		{"ErrReader", Func, 16, "func(err error) io.Reader"},
 16845  		{"ErrTimeout", Var, 0, ""},
 16846  		{"HalfReader", Func, 0, "func(r io.Reader) io.Reader"},
 16847  		{"NewReadLogger", Func, 0, "func(prefix string, r io.Reader) io.Reader"},
 16848  		{"NewWriteLogger", Func, 0, "func(prefix string, w io.Writer) io.Writer"},
 16849  		{"OneByteReader", Func, 0, "func(r io.Reader) io.Reader"},
 16850  		{"TestReader", Func, 16, "func(r io.Reader, content []byte) error"},
 16851  		{"TimeoutReader", Func, 0, "func(r io.Reader) io.Reader"},
 16852  		{"TruncateWriter", Func, 0, "func(w io.Writer, n int64) io.Writer"},
 16853  	},
 16854  	"testing/quick": {
 16855  		{"(*CheckEqualError).Error", Method, 0, ""},
 16856  		{"(*CheckError).Error", Method, 0, ""},
 16857  		{"(SetupError).Error", Method, 0, ""},
 16858  		{"Check", Func, 0, "func(f any, config *Config) error"},
 16859  		{"CheckEqual", Func, 0, "func(f any, g any, config *Config) error"},
 16860  		{"CheckEqualError", Type, 0, ""},
 16861  		{"CheckEqualError.CheckError", Field, 0, ""},
 16862  		{"CheckEqualError.Out1", Field, 0, ""},
 16863  		{"CheckEqualError.Out2", Field, 0, ""},
 16864  		{"CheckError", Type, 0, ""},
 16865  		{"CheckError.Count", Field, 0, ""},
 16866  		{"CheckError.In", Field, 0, ""},
 16867  		{"Config", Type, 0, ""},
 16868  		{"Config.MaxCount", Field, 0, ""},
 16869  		{"Config.MaxCountScale", Field, 0, ""},
 16870  		{"Config.Rand", Field, 0, ""},
 16871  		{"Config.Values", Field, 0, ""},
 16872  		{"Generator", Type, 0, ""},
 16873  		{"SetupError", Type, 0, ""},
 16874  		{"Value", Func, 0, "func(t reflect.Type, rand *rand.Rand) (value reflect.Value, ok bool)"},
 16875  	},
 16876  	"testing/slogtest": {
 16877  		{"Run", Func, 22, "func(t *testing.T, newHandler func(*testing.T) slog.Handler, result func(*testing.T) map[string]any)"},
 16878  		{"TestHandler", Func, 21, "func(h slog.Handler, results func() []map[string]any) error"},
 16879  	},
 16880  	"testing/synctest": {
 16881  		{"Test", Func, 25, "func(t *testing.T, f func(*testing.T))"},
 16882  		{"Wait", Func, 25, "func()"},
 16883  	},
 16884  	"text/scanner": {
 16885  		{"(*Position).IsValid", Method, 0, ""},
 16886  		{"(*Scanner).Init", Method, 0, ""},
 16887  		{"(*Scanner).IsValid", Method, 0, ""},
 16888  		{"(*Scanner).Next", Method, 0, ""},
 16889  		{"(*Scanner).Peek", Method, 0, ""},
 16890  		{"(*Scanner).Pos", Method, 0, ""},
 16891  		{"(*Scanner).Scan", Method, 0, ""},
 16892  		{"(*Scanner).TokenText", Method, 0, ""},
 16893  		{"(Position).String", Method, 0, ""},
 16894  		{"(Scanner).String", Method, 0, ""},
 16895  		{"Char", Const, 0, ""},
 16896  		{"Comment", Const, 0, ""},
 16897  		{"EOF", Const, 0, ""},
 16898  		{"Float", Const, 0, ""},
 16899  		{"GoTokens", Const, 0, ""},
 16900  		{"GoWhitespace", Const, 0, ""},
 16901  		{"Ident", Const, 0, ""},
 16902  		{"Int", Const, 0, ""},
 16903  		{"Position", Type, 0, ""},
 16904  		{"Position.Column", Field, 0, ""},
 16905  		{"Position.Filename", Field, 0, ""},
 16906  		{"Position.Line", Field, 0, ""},
 16907  		{"Position.Offset", Field, 0, ""},
 16908  		{"RawString", Const, 0, ""},
 16909  		{"ScanChars", Const, 0, ""},
 16910  		{"ScanComments", Const, 0, ""},
 16911  		{"ScanFloats", Const, 0, ""},
 16912  		{"ScanIdents", Const, 0, ""},
 16913  		{"ScanInts", Const, 0, ""},
 16914  		{"ScanRawStrings", Const, 0, ""},
 16915  		{"ScanStrings", Const, 0, ""},
 16916  		{"Scanner", Type, 0, ""},
 16917  		{"Scanner.Error", Field, 0, ""},
 16918  		{"Scanner.ErrorCount", Field, 0, ""},
 16919  		{"Scanner.IsIdentRune", Field, 4, ""},
 16920  		{"Scanner.Mode", Field, 0, ""},
 16921  		{"Scanner.Position", Field, 0, ""},
 16922  		{"Scanner.Whitespace", Field, 0, ""},
 16923  		{"SkipComments", Const, 0, ""},
 16924  		{"String", Const, 0, ""},
 16925  		{"TokenString", Func, 0, "func(tok rune) string"},
 16926  	},
 16927  	"text/tabwriter": {
 16928  		{"(*Writer).Flush", Method, 0, ""},
 16929  		{"(*Writer).Init", Method, 0, ""},
 16930  		{"(*Writer).Write", Method, 0, ""},
 16931  		{"AlignRight", Const, 0, ""},
 16932  		{"Debug", Const, 0, ""},
 16933  		{"DiscardEmptyColumns", Const, 0, ""},
 16934  		{"Escape", Const, 0, ""},
 16935  		{"FilterHTML", Const, 0, ""},
 16936  		{"NewWriter", Func, 0, "func(output io.Writer, minwidth int, tabwidth int, padding int, padchar byte, flags uint) *Writer"},
 16937  		{"StripEscape", Const, 0, ""},
 16938  		{"TabIndent", Const, 0, ""},
 16939  		{"Writer", Type, 0, ""},
 16940  	},
 16941  	"text/template": {
 16942  		{"(*Template).AddParseTree", Method, 0, ""},
 16943  		{"(*Template).Clone", Method, 0, ""},
 16944  		{"(*Template).DefinedTemplates", Method, 5, ""},
 16945  		{"(*Template).Delims", Method, 0, ""},
 16946  		{"(*Template).Execute", Method, 0, ""},
 16947  		{"(*Template).ExecuteTemplate", Method, 0, ""},
 16948  		{"(*Template).Funcs", Method, 0, ""},
 16949  		{"(*Template).Lookup", Method, 0, ""},
 16950  		{"(*Template).Name", Method, 0, ""},
 16951  		{"(*Template).New", Method, 0, ""},
 16952  		{"(*Template).Option", Method, 5, ""},
 16953  		{"(*Template).Parse", Method, 0, ""},
 16954  		{"(*Template).ParseFS", Method, 16, ""},
 16955  		{"(*Template).ParseFiles", Method, 0, ""},
 16956  		{"(*Template).ParseGlob", Method, 0, ""},
 16957  		{"(*Template).Templates", Method, 0, ""},
 16958  		{"(ExecError).Error", Method, 6, ""},
 16959  		{"(ExecError).Unwrap", Method, 13, ""},
 16960  		{"(Template).Copy", Method, 2, ""},
 16961  		{"(Template).ErrorContext", Method, 1, ""},
 16962  		{"ExecError", Type, 6, ""},
 16963  		{"ExecError.Err", Field, 6, ""},
 16964  		{"ExecError.Name", Field, 6, ""},
 16965  		{"FuncMap", Type, 0, ""},
 16966  		{"HTMLEscape", Func, 0, "func(w io.Writer, b []byte)"},
 16967  		{"HTMLEscapeString", Func, 0, "func(s string) string"},
 16968  		{"HTMLEscaper", Func, 0, "func(args ...any) string"},
 16969  		{"IsTrue", Func, 6, "func(val any) (truth bool, ok bool)"},
 16970  		{"JSEscape", Func, 0, "func(w io.Writer, b []byte)"},
 16971  		{"JSEscapeString", Func, 0, "func(s string) string"},
 16972  		{"JSEscaper", Func, 0, "func(args ...any) string"},
 16973  		{"Must", Func, 0, "func(t *Template, err error) *Template"},
 16974  		{"New", Func, 0, "func(name string) *Template"},
 16975  		{"ParseFS", Func, 16, "func(fsys fs.FS, patterns ...string) (*Template, error)"},
 16976  		{"ParseFiles", Func, 0, "func(filenames ...string) (*Template, error)"},
 16977  		{"ParseGlob", Func, 0, "func(pattern string) (*Template, error)"},
 16978  		{"Template", Type, 0, ""},
 16979  		{"Template.Tree", Field, 0, ""},
 16980  		{"URLQueryEscaper", Func, 0, "func(args ...any) string"},
 16981  	},
 16982  	"text/template/parse": {
 16983  		{"(*ActionNode).Copy", Method, 0, ""},
 16984  		{"(*ActionNode).String", Method, 0, ""},
 16985  		{"(*BoolNode).Copy", Method, 0, ""},
 16986  		{"(*BoolNode).String", Method, 0, ""},
 16987  		{"(*BranchNode).Copy", Method, 4, ""},
 16988  		{"(*BranchNode).String", Method, 0, ""},
 16989  		{"(*BreakNode).Copy", Method, 18, ""},
 16990  		{"(*BreakNode).String", Method, 18, ""},
 16991  		{"(*ChainNode).Add", Method, 1, ""},
 16992  		{"(*ChainNode).Copy", Method, 1, ""},
 16993  		{"(*ChainNode).String", Method, 1, ""},
 16994  		{"(*CommandNode).Copy", Method, 0, ""},
 16995  		{"(*CommandNode).String", Method, 0, ""},
 16996  		{"(*CommentNode).Copy", Method, 16, ""},
 16997  		{"(*CommentNode).String", Method, 16, ""},
 16998  		{"(*ContinueNode).Copy", Method, 18, ""},
 16999  		{"(*ContinueNode).String", Method, 18, ""},
 17000  		{"(*DotNode).Copy", Method, 0, ""},
 17001  		{"(*DotNode).String", Method, 0, ""},
 17002  		{"(*DotNode).Type", Method, 0, ""},
 17003  		{"(*FieldNode).Copy", Method, 0, ""},
 17004  		{"(*FieldNode).String", Method, 0, ""},
 17005  		{"(*IdentifierNode).Copy", Method, 0, ""},
 17006  		{"(*IdentifierNode).SetPos", Method, 1, ""},
 17007  		{"(*IdentifierNode).SetTree", Method, 4, ""},
 17008  		{"(*IdentifierNode).String", Method, 0, ""},
 17009  		{"(*IfNode).Copy", Method, 0, ""},
 17010  		{"(*IfNode).String", Method, 0, ""},
 17011  		{"(*ListNode).Copy", Method, 0, ""},
 17012  		{"(*ListNode).CopyList", Method, 0, ""},
 17013  		{"(*ListNode).String", Method, 0, ""},
 17014  		{"(*NilNode).Copy", Method, 1, ""},
 17015  		{"(*NilNode).String", Method, 1, ""},
 17016  		{"(*NilNode).Type", Method, 1, ""},
 17017  		{"(*NumberNode).Copy", Method, 0, ""},
 17018  		{"(*NumberNode).String", Method, 0, ""},
 17019  		{"(*PipeNode).Copy", Method, 0, ""},
 17020  		{"(*PipeNode).CopyPipe", Method, 0, ""},
 17021  		{"(*PipeNode).String", Method, 0, ""},
 17022  		{"(*RangeNode).Copy", Method, 0, ""},
 17023  		{"(*RangeNode).String", Method, 0, ""},
 17024  		{"(*StringNode).Copy", Method, 0, ""},
 17025  		{"(*StringNode).String", Method, 0, ""},
 17026  		{"(*TemplateNode).Copy", Method, 0, ""},
 17027  		{"(*TemplateNode).String", Method, 0, ""},
 17028  		{"(*TextNode).Copy", Method, 0, ""},
 17029  		{"(*TextNode).String", Method, 0, ""},
 17030  		{"(*Tree).Copy", Method, 2, ""},
 17031  		{"(*Tree).ErrorContext", Method, 1, ""},
 17032  		{"(*Tree).Parse", Method, 0, ""},
 17033  		{"(*VariableNode).Copy", Method, 0, ""},
 17034  		{"(*VariableNode).String", Method, 0, ""},
 17035  		{"(*WithNode).Copy", Method, 0, ""},
 17036  		{"(*WithNode).String", Method, 0, ""},
 17037  		{"(ActionNode).Position", Method, 1, ""},
 17038  		{"(ActionNode).Type", Method, 0, ""},
 17039  		{"(BoolNode).Position", Method, 1, ""},
 17040  		{"(BoolNode).Type", Method, 0, ""},
 17041  		{"(BranchNode).Position", Method, 1, ""},
 17042  		{"(BranchNode).Type", Method, 0, ""},
 17043  		{"(BreakNode).Position", Method, 18, ""},
 17044  		{"(BreakNode).Type", Method, 18, ""},
 17045  		{"(ChainNode).Position", Method, 1, ""},
 17046  		{"(ChainNode).Type", Method, 1, ""},
 17047  		{"(CommandNode).Position", Method, 1, ""},
 17048  		{"(CommandNode).Type", Method, 0, ""},
 17049  		{"(CommentNode).Position", Method, 16, ""},
 17050  		{"(CommentNode).Type", Method, 16, ""},
 17051  		{"(ContinueNode).Position", Method, 18, ""},
 17052  		{"(ContinueNode).Type", Method, 18, ""},
 17053  		{"(DotNode).Position", Method, 1, ""},
 17054  		{"(FieldNode).Position", Method, 1, ""},
 17055  		{"(FieldNode).Type", Method, 0, ""},
 17056  		{"(IdentifierNode).Position", Method, 1, ""},
 17057  		{"(IdentifierNode).Type", Method, 0, ""},
 17058  		{"(IfNode).Position", Method, 1, ""},
 17059  		{"(IfNode).Type", Method, 0, ""},
 17060  		{"(ListNode).Position", Method, 1, ""},
 17061  		{"(ListNode).Type", Method, 0, ""},
 17062  		{"(NilNode).Position", Method, 1, ""},
 17063  		{"(NodeType).Type", Method, 0, ""},
 17064  		{"(NumberNode).Position", Method, 1, ""},
 17065  		{"(NumberNode).Type", Method, 0, ""},
 17066  		{"(PipeNode).Position", Method, 1, ""},
 17067  		{"(PipeNode).Type", Method, 0, ""},
 17068  		{"(Pos).Position", Method, 1, ""},
 17069  		{"(RangeNode).Position", Method, 1, ""},
 17070  		{"(RangeNode).Type", Method, 0, ""},
 17071  		{"(StringNode).Position", Method, 1, ""},
 17072  		{"(StringNode).Type", Method, 0, ""},
 17073  		{"(TemplateNode).Position", Method, 1, ""},
 17074  		{"(TemplateNode).Type", Method, 0, ""},
 17075  		{"(TextNode).Position", Method, 1, ""},
 17076  		{"(TextNode).Type", Method, 0, ""},
 17077  		{"(VariableNode).Position", Method, 1, ""},
 17078  		{"(VariableNode).Type", Method, 0, ""},
 17079  		{"(WithNode).Position", Method, 1, ""},
 17080  		{"(WithNode).Type", Method, 0, ""},
 17081  		{"ActionNode", Type, 0, ""},
 17082  		{"ActionNode.Line", Field, 0, ""},
 17083  		{"ActionNode.NodeType", Field, 0, ""},
 17084  		{"ActionNode.Pipe", Field, 0, ""},
 17085  		{"ActionNode.Pos", Field, 1, ""},
 17086  		{"BoolNode", Type, 0, ""},
 17087  		{"BoolNode.NodeType", Field, 0, ""},
 17088  		{"BoolNode.Pos", Field, 1, ""},
 17089  		{"BoolNode.True", Field, 0, ""},
 17090  		{"BranchNode", Type, 0, ""},
 17091  		{"BranchNode.ElseList", Field, 0, ""},
 17092  		{"BranchNode.Line", Field, 0, ""},
 17093  		{"BranchNode.List", Field, 0, ""},
 17094  		{"BranchNode.NodeType", Field, 0, ""},
 17095  		{"BranchNode.Pipe", Field, 0, ""},
 17096  		{"BranchNode.Pos", Field, 1, ""},
 17097  		{"BreakNode", Type, 18, ""},
 17098  		{"BreakNode.Line", Field, 18, ""},
 17099  		{"BreakNode.NodeType", Field, 18, ""},
 17100  		{"BreakNode.Pos", Field, 18, ""},
 17101  		{"ChainNode", Type, 1, ""},
 17102  		{"ChainNode.Field", Field, 1, ""},
 17103  		{"ChainNode.Node", Field, 1, ""},
 17104  		{"ChainNode.NodeType", Field, 1, ""},
 17105  		{"ChainNode.Pos", Field, 1, ""},
 17106  		{"CommandNode", Type, 0, ""},
 17107  		{"CommandNode.Args", Field, 0, ""},
 17108  		{"CommandNode.NodeType", Field, 0, ""},
 17109  		{"CommandNode.Pos", Field, 1, ""},
 17110  		{"CommentNode", Type, 16, ""},
 17111  		{"CommentNode.NodeType", Field, 16, ""},
 17112  		{"CommentNode.Pos", Field, 16, ""},
 17113  		{"CommentNode.Text", Field, 16, ""},
 17114  		{"ContinueNode", Type, 18, ""},
 17115  		{"ContinueNode.Line", Field, 18, ""},
 17116  		{"ContinueNode.NodeType", Field, 18, ""},
 17117  		{"ContinueNode.Pos", Field, 18, ""},
 17118  		{"DotNode", Type, 0, ""},
 17119  		{"DotNode.NodeType", Field, 4, ""},
 17120  		{"DotNode.Pos", Field, 1, ""},
 17121  		{"FieldNode", Type, 0, ""},
 17122  		{"FieldNode.Ident", Field, 0, ""},
 17123  		{"FieldNode.NodeType", Field, 0, ""},
 17124  		{"FieldNode.Pos", Field, 1, ""},
 17125  		{"IdentifierNode", Type, 0, ""},
 17126  		{"IdentifierNode.Ident", Field, 0, ""},
 17127  		{"IdentifierNode.NodeType", Field, 0, ""},
 17128  		{"IdentifierNode.Pos", Field, 1, ""},
 17129  		{"IfNode", Type, 0, ""},
 17130  		{"IfNode.BranchNode", Field, 0, ""},
 17131  		{"IsEmptyTree", Func, 0, "func(n Node) bool"},
 17132  		{"ListNode", Type, 0, ""},
 17133  		{"ListNode.NodeType", Field, 0, ""},
 17134  		{"ListNode.Nodes", Field, 0, ""},
 17135  		{"ListNode.Pos", Field, 1, ""},
 17136  		{"Mode", Type, 16, ""},
 17137  		{"New", Func, 0, "func(name string, funcs ...map[string]any) *Tree"},
 17138  		{"NewIdentifier", Func, 0, "func(ident string) *IdentifierNode"},
 17139  		{"NilNode", Type, 1, ""},
 17140  		{"NilNode.NodeType", Field, 4, ""},
 17141  		{"NilNode.Pos", Field, 1, ""},
 17142  		{"Node", Type, 0, ""},
 17143  		{"NodeAction", Const, 0, ""},
 17144  		{"NodeBool", Const, 0, ""},
 17145  		{"NodeBreak", Const, 18, ""},
 17146  		{"NodeChain", Const, 1, ""},
 17147  		{"NodeCommand", Const, 0, ""},
 17148  		{"NodeComment", Const, 16, ""},
 17149  		{"NodeContinue", Const, 18, ""},
 17150  		{"NodeDot", Const, 0, ""},
 17151  		{"NodeField", Const, 0, ""},
 17152  		{"NodeIdentifier", Const, 0, ""},
 17153  		{"NodeIf", Const, 0, ""},
 17154  		{"NodeList", Const, 0, ""},
 17155  		{"NodeNil", Const, 1, ""},
 17156  		{"NodeNumber", Const, 0, ""},
 17157  		{"NodePipe", Const, 0, ""},
 17158  		{"NodeRange", Const, 0, ""},
 17159  		{"NodeString", Const, 0, ""},
 17160  		{"NodeTemplate", Const, 0, ""},
 17161  		{"NodeText", Const, 0, ""},
 17162  		{"NodeType", Type, 0, ""},
 17163  		{"NodeVariable", Const, 0, ""},
 17164  		{"NodeWith", Const, 0, ""},
 17165  		{"NumberNode", Type, 0, ""},
 17166  		{"NumberNode.Complex128", Field, 0, ""},
 17167  		{"NumberNode.Float64", Field, 0, ""},
 17168  		{"NumberNode.Int64", Field, 0, ""},
 17169  		{"NumberNode.IsComplex", Field, 0, ""},
 17170  		{"NumberNode.IsFloat", Field, 0, ""},
 17171  		{"NumberNode.IsInt", Field, 0, ""},
 17172  		{"NumberNode.IsUint", Field, 0, ""},
 17173  		{"NumberNode.NodeType", Field, 0, ""},
 17174  		{"NumberNode.Pos", Field, 1, ""},
 17175  		{"NumberNode.Text", Field, 0, ""},
 17176  		{"NumberNode.Uint64", Field, 0, ""},
 17177  		{"Parse", Func, 0, "func(name string, text string, leftDelim string, rightDelim string, funcs ...map[string]any) (map[string]*Tree, error)"},
 17178  		{"ParseComments", Const, 16, ""},
 17179  		{"PipeNode", Type, 0, ""},
 17180  		{"PipeNode.Cmds", Field, 0, ""},
 17181  		{"PipeNode.Decl", Field, 0, ""},
 17182  		{"PipeNode.IsAssign", Field, 11, ""},
 17183  		{"PipeNode.Line", Field, 0, ""},
 17184  		{"PipeNode.NodeType", Field, 0, ""},
 17185  		{"PipeNode.Pos", Field, 1, ""},
 17186  		{"Pos", Type, 1, ""},
 17187  		{"RangeNode", Type, 0, ""},
 17188  		{"RangeNode.BranchNode", Field, 0, ""},
 17189  		{"SkipFuncCheck", Const, 17, ""},
 17190  		{"StringNode", Type, 0, ""},
 17191  		{"StringNode.NodeType", Field, 0, ""},
 17192  		{"StringNode.Pos", Field, 1, ""},
 17193  		{"StringNode.Quoted", Field, 0, ""},
 17194  		{"StringNode.Text", Field, 0, ""},
 17195  		{"TemplateNode", Type, 0, ""},
 17196  		{"TemplateNode.Line", Field, 0, ""},
 17197  		{"TemplateNode.Name", Field, 0, ""},
 17198  		{"TemplateNode.NodeType", Field, 0, ""},
 17199  		{"TemplateNode.Pipe", Field, 0, ""},
 17200  		{"TemplateNode.Pos", Field, 1, ""},
 17201  		{"TextNode", Type, 0, ""},
 17202  		{"TextNode.NodeType", Field, 0, ""},
 17203  		{"TextNode.Pos", Field, 1, ""},
 17204  		{"TextNode.Text", Field, 0, ""},
 17205  		{"Tree", Type, 0, ""},
 17206  		{"Tree.Mode", Field, 16, ""},
 17207  		{"Tree.Name", Field, 0, ""},
 17208  		{"Tree.ParseName", Field, 1, ""},
 17209  		{"Tree.Root", Field, 0, ""},
 17210  		{"VariableNode", Type, 0, ""},
 17211  		{"VariableNode.Ident", Field, 0, ""},
 17212  		{"VariableNode.NodeType", Field, 0, ""},
 17213  		{"VariableNode.Pos", Field, 1, ""},
 17214  		{"WithNode", Type, 0, ""},
 17215  		{"WithNode.BranchNode", Field, 0, ""},
 17216  	},
 17217  	"time": {
 17218  		{"(*Location).String", Method, 0, ""},
 17219  		{"(*ParseError).Error", Method, 0, ""},
 17220  		{"(*Ticker).Reset", Method, 15, ""},
 17221  		{"(*Ticker).Stop", Method, 0, ""},
 17222  		{"(*Time).GobDecode", Method, 0, ""},
 17223  		{"(*Time).UnmarshalBinary", Method, 2, ""},
 17224  		{"(*Time).UnmarshalJSON", Method, 0, ""},
 17225  		{"(*Time).UnmarshalText", Method, 2, ""},
 17226  		{"(*Timer).Reset", Method, 1, ""},
 17227  		{"(*Timer).Stop", Method, 0, ""},
 17228  		{"(Duration).Abs", Method, 19, ""},
 17229  		{"(Duration).Hours", Method, 0, ""},
 17230  		{"(Duration).Microseconds", Method, 13, ""},
 17231  		{"(Duration).Milliseconds", Method, 13, ""},
 17232  		{"(Duration).Minutes", Method, 0, ""},
 17233  		{"(Duration).Nanoseconds", Method, 0, ""},
 17234  		{"(Duration).Round", Method, 9, ""},
 17235  		{"(Duration).Seconds", Method, 0, ""},
 17236  		{"(Duration).String", Method, 0, ""},
 17237  		{"(Duration).Truncate", Method, 9, ""},
 17238  		{"(Month).String", Method, 0, ""},
 17239  		{"(Time).Add", Method, 0, ""},
 17240  		{"(Time).AddDate", Method, 0, ""},
 17241  		{"(Time).After", Method, 0, ""},
 17242  		{"(Time).AppendBinary", Method, 24, ""},
 17243  		{"(Time).AppendFormat", Method, 5, ""},
 17244  		{"(Time).AppendText", Method, 24, ""},
 17245  		{"(Time).Before", Method, 0, ""},
 17246  		{"(Time).Clock", Method, 0, ""},
 17247  		{"(Time).Compare", Method, 20, ""},
 17248  		{"(Time).Date", Method, 0, ""},
 17249  		{"(Time).Day", Method, 0, ""},
 17250  		{"(Time).Equal", Method, 0, ""},
 17251  		{"(Time).Format", Method, 0, ""},
 17252  		{"(Time).GoString", Method, 17, ""},
 17253  		{"(Time).GobEncode", Method, 0, ""},
 17254  		{"(Time).Hour", Method, 0, ""},
 17255  		{"(Time).ISOWeek", Method, 0, ""},
 17256  		{"(Time).In", Method, 0, ""},
 17257  		{"(Time).IsDST", Method, 17, ""},
 17258  		{"(Time).IsZero", Method, 0, ""},
 17259  		{"(Time).Local", Method, 0, ""},
 17260  		{"(Time).Location", Method, 0, ""},
 17261  		{"(Time).MarshalBinary", Method, 2, ""},
 17262  		{"(Time).MarshalJSON", Method, 0, ""},
 17263  		{"(Time).MarshalText", Method, 2, ""},
 17264  		{"(Time).Minute", Method, 0, ""},
 17265  		{"(Time).Month", Method, 0, ""},
 17266  		{"(Time).Nanosecond", Method, 0, ""},
 17267  		{"(Time).Round", Method, 1, ""},
 17268  		{"(Time).Second", Method, 0, ""},
 17269  		{"(Time).String", Method, 0, ""},
 17270  		{"(Time).Sub", Method, 0, ""},
 17271  		{"(Time).Truncate", Method, 1, ""},
 17272  		{"(Time).UTC", Method, 0, ""},
 17273  		{"(Time).Unix", Method, 0, ""},
 17274  		{"(Time).UnixMicro", Method, 17, ""},
 17275  		{"(Time).UnixMilli", Method, 17, ""},
 17276  		{"(Time).UnixNano", Method, 0, ""},
 17277  		{"(Time).Weekday", Method, 0, ""},
 17278  		{"(Time).Year", Method, 0, ""},
 17279  		{"(Time).YearDay", Method, 1, ""},
 17280  		{"(Time).Zone", Method, 0, ""},
 17281  		{"(Time).ZoneBounds", Method, 19, ""},
 17282  		{"(Weekday).String", Method, 0, ""},
 17283  		{"ANSIC", Const, 0, ""},
 17284  		{"After", Func, 0, "func(d Duration) <-chan Time"},
 17285  		{"AfterFunc", Func, 0, "func(d Duration, f func()) *Timer"},
 17286  		{"April", Const, 0, ""},
 17287  		{"August", Const, 0, ""},
 17288  		{"Date", Func, 0, "func(year int, month Month, day int, hour int, min int, sec int, nsec int, loc *Location) Time"},
 17289  		{"DateOnly", Const, 20, ""},
 17290  		{"DateTime", Const, 20, ""},
 17291  		{"December", Const, 0, ""},
 17292  		{"Duration", Type, 0, ""},
 17293  		{"February", Const, 0, ""},
 17294  		{"FixedZone", Func, 0, "func(name string, offset int) *Location"},
 17295  		{"Friday", Const, 0, ""},
 17296  		{"Hour", Const, 0, ""},
 17297  		{"January", Const, 0, ""},
 17298  		{"July", Const, 0, ""},
 17299  		{"June", Const, 0, ""},
 17300  		{"Kitchen", Const, 0, ""},
 17301  		{"Layout", Const, 17, ""},
 17302  		{"LoadLocation", Func, 0, "func(name string) (*Location, error)"},
 17303  		{"LoadLocationFromTZData", Func, 10, "func(name string, data []byte) (*Location, error)"},
 17304  		{"Local", Var, 0, ""},
 17305  		{"Location", Type, 0, ""},
 17306  		{"March", Const, 0, ""},
 17307  		{"May", Const, 0, ""},
 17308  		{"Microsecond", Const, 0, ""},
 17309  		{"Millisecond", Const, 0, ""},
 17310  		{"Minute", Const, 0, ""},
 17311  		{"Monday", Const, 0, ""},
 17312  		{"Month", Type, 0, ""},
 17313  		{"Nanosecond", Const, 0, ""},
 17314  		{"NewTicker", Func, 0, "func(d Duration) *Ticker"},
 17315  		{"NewTimer", Func, 0, "func(d Duration) *Timer"},
 17316  		{"November", Const, 0, ""},
 17317  		{"Now", Func, 0, "func() Time"},
 17318  		{"October", Const, 0, ""},
 17319  		{"Parse", Func, 0, "func(layout string, value string) (Time, error)"},
 17320  		{"ParseDuration", Func, 0, "func(s string) (Duration, error)"},
 17321  		{"ParseError", Type, 0, ""},
 17322  		{"ParseError.Layout", Field, 0, ""},
 17323  		{"ParseError.LayoutElem", Field, 0, ""},
 17324  		{"ParseError.Message", Field, 0, ""},
 17325  		{"ParseError.Value", Field, 0, ""},
 17326  		{"ParseError.ValueElem", Field, 0, ""},
 17327  		{"ParseInLocation", Func, 1, "func(layout string, value string, loc *Location) (Time, error)"},
 17328  		{"RFC1123", Const, 0, ""},
 17329  		{"RFC1123Z", Const, 0, ""},
 17330  		{"RFC3339", Const, 0, ""},
 17331  		{"RFC3339Nano", Const, 0, ""},
 17332  		{"RFC822", Const, 0, ""},
 17333  		{"RFC822Z", Const, 0, ""},
 17334  		{"RFC850", Const, 0, ""},
 17335  		{"RubyDate", Const, 0, ""},
 17336  		{"Saturday", Const, 0, ""},
 17337  		{"Second", Const, 0, ""},
 17338  		{"September", Const, 0, ""},
 17339  		{"Since", Func, 0, "func(t Time) Duration"},
 17340  		{"Sleep", Func, 0, "func(d Duration)"},
 17341  		{"Stamp", Const, 0, ""},
 17342  		{"StampMicro", Const, 0, ""},
 17343  		{"StampMilli", Const, 0, ""},
 17344  		{"StampNano", Const, 0, ""},
 17345  		{"Sunday", Const, 0, ""},
 17346  		{"Thursday", Const, 0, ""},
 17347  		{"Tick", Func, 0, "func(d Duration) <-chan Time"},
 17348  		{"Ticker", Type, 0, ""},
 17349  		{"Ticker.C", Field, 0, ""},
 17350  		{"Time", Type, 0, ""},
 17351  		{"TimeOnly", Const, 20, ""},
 17352  		{"Timer", Type, 0, ""},
 17353  		{"Timer.C", Field, 0, ""},
 17354  		{"Tuesday", Const, 0, ""},
 17355  		{"UTC", Var, 0, ""},
 17356  		{"Unix", Func, 0, "func(sec int64, nsec int64) Time"},
 17357  		{"UnixDate", Const, 0, ""},
 17358  		{"UnixMicro", Func, 17, "func(usec int64) Time"},
 17359  		{"UnixMilli", Func, 17, "func(msec int64) Time"},
 17360  		{"Until", Func, 8, "func(t Time) Duration"},
 17361  		{"Wednesday", Const, 0, ""},
 17362  		{"Weekday", Type, 0, ""},
 17363  	},
 17364  	"unicode": {
 17365  		{"(SpecialCase).ToLower", Method, 0, ""},
 17366  		{"(SpecialCase).ToTitle", Method, 0, ""},
 17367  		{"(SpecialCase).ToUpper", Method, 0, ""},
 17368  		{"ASCII_Hex_Digit", Var, 0, ""},
 17369  		{"Adlam", Var, 7, ""},
 17370  		{"Ahom", Var, 5, ""},
 17371  		{"Anatolian_Hieroglyphs", Var, 5, ""},
 17372  		{"Arabic", Var, 0, ""},
 17373  		{"Armenian", Var, 0, ""},
 17374  		{"Avestan", Var, 0, ""},
 17375  		{"AzeriCase", Var, 0, ""},
 17376  		{"Balinese", Var, 0, ""},
 17377  		{"Bamum", Var, 0, ""},
 17378  		{"Bassa_Vah", Var, 4, ""},
 17379  		{"Batak", Var, 0, ""},
 17380  		{"Bengali", Var, 0, ""},
 17381  		{"Bhaiksuki", Var, 7, ""},
 17382  		{"Bidi_Control", Var, 0, ""},
 17383  		{"Bopomofo", Var, 0, ""},
 17384  		{"Brahmi", Var, 0, ""},
 17385  		{"Braille", Var, 0, ""},
 17386  		{"Buginese", Var, 0, ""},
 17387  		{"Buhid", Var, 0, ""},
 17388  		{"C", Var, 0, ""},
 17389  		{"Canadian_Aboriginal", Var, 0, ""},
 17390  		{"Carian", Var, 0, ""},
 17391  		{"CaseRange", Type, 0, ""},
 17392  		{"CaseRange.Delta", Field, 0, ""},
 17393  		{"CaseRange.Hi", Field, 0, ""},
 17394  		{"CaseRange.Lo", Field, 0, ""},
 17395  		{"CaseRanges", Var, 0, ""},
 17396  		{"Categories", Var, 0, ""},
 17397  		{"CategoryAliases", Var, 25, ""},
 17398  		{"Caucasian_Albanian", Var, 4, ""},
 17399  		{"Cc", Var, 0, ""},
 17400  		{"Cf", Var, 0, ""},
 17401  		{"Chakma", Var, 1, ""},
 17402  		{"Cham", Var, 0, ""},
 17403  		{"Cherokee", Var, 0, ""},
 17404  		{"Chorasmian", Var, 16, ""},
 17405  		{"Cn", Var, 25, ""},
 17406  		{"Co", Var, 0, ""},
 17407  		{"Common", Var, 0, ""},
 17408  		{"Coptic", Var, 0, ""},
 17409  		{"Cs", Var, 0, ""},
 17410  		{"Cuneiform", Var, 0, ""},
 17411  		{"Cypriot", Var, 0, ""},
 17412  		{"Cypro_Minoan", Var, 21, ""},
 17413  		{"Cyrillic", Var, 0, ""},
 17414  		{"Dash", Var, 0, ""},
 17415  		{"Deprecated", Var, 0, ""},
 17416  		{"Deseret", Var, 0, ""},
 17417  		{"Devanagari", Var, 0, ""},
 17418  		{"Diacritic", Var, 0, ""},
 17419  		{"Digit", Var, 0, ""},
 17420  		{"Dives_Akuru", Var, 16, ""},
 17421  		{"Dogra", Var, 13, ""},
 17422  		{"Duployan", Var, 4, ""},
 17423  		{"Egyptian_Hieroglyphs", Var, 0, ""},
 17424  		{"Elbasan", Var, 4, ""},
 17425  		{"Elymaic", Var, 14, ""},
 17426  		{"Ethiopic", Var, 0, ""},
 17427  		{"Extender", Var, 0, ""},
 17428  		{"FoldCategory", Var, 0, ""},
 17429  		{"FoldScript", Var, 0, ""},
 17430  		{"Georgian", Var, 0, ""},
 17431  		{"Glagolitic", Var, 0, ""},
 17432  		{"Gothic", Var, 0, ""},
 17433  		{"Grantha", Var, 4, ""},
 17434  		{"GraphicRanges", Var, 0, ""},
 17435  		{"Greek", Var, 0, ""},
 17436  		{"Gujarati", Var, 0, ""},
 17437  		{"Gunjala_Gondi", Var, 13, ""},
 17438  		{"Gurmukhi", Var, 0, ""},
 17439  		{"Han", Var, 0, ""},
 17440  		{"Hangul", Var, 0, ""},
 17441  		{"Hanifi_Rohingya", Var, 13, ""},
 17442  		{"Hanunoo", Var, 0, ""},
 17443  		{"Hatran", Var, 5, ""},
 17444  		{"Hebrew", Var, 0, ""},
 17445  		{"Hex_Digit", Var, 0, ""},
 17446  		{"Hiragana", Var, 0, ""},
 17447  		{"Hyphen", Var, 0, ""},
 17448  		{"IDS_Binary_Operator", Var, 0, ""},
 17449  		{"IDS_Trinary_Operator", Var, 0, ""},
 17450  		{"Ideographic", Var, 0, ""},
 17451  		{"Imperial_Aramaic", Var, 0, ""},
 17452  		{"In", Func, 2, "func(r rune, ranges ...*RangeTable) bool"},
 17453  		{"Inherited", Var, 0, ""},
 17454  		{"Inscriptional_Pahlavi", Var, 0, ""},
 17455  		{"Inscriptional_Parthian", Var, 0, ""},
 17456  		{"Is", Func, 0, "func(rangeTab *RangeTable, r rune) bool"},
 17457  		{"IsControl", Func, 0, "func(r rune) bool"},
 17458  		{"IsDigit", Func, 0, "func(r rune) bool"},
 17459  		{"IsGraphic", Func, 0, "func(r rune) bool"},
 17460  		{"IsLetter", Func, 0, "func(r rune) bool"},
 17461  		{"IsLower", Func, 0, "func(r rune) bool"},
 17462  		{"IsMark", Func, 0, "func(r rune) bool"},
 17463  		{"IsNumber", Func, 0, "func(r rune) bool"},
 17464  		{"IsOneOf", Func, 0, "func(ranges []*RangeTable, r rune) bool"},
 17465  		{"IsPrint", Func, 0, "func(r rune) bool"},
 17466  		{"IsPunct", Func, 0, "func(r rune) bool"},
 17467  		{"IsSpace", Func, 0, "func(r rune) bool"},
 17468  		{"IsSymbol", Func, 0, "func(r rune) bool"},
 17469  		{"IsTitle", Func, 0, "func(r rune) bool"},
 17470  		{"IsUpper", Func, 0, "func(r rune) bool"},
 17471  		{"Javanese", Var, 0, ""},
 17472  		{"Join_Control", Var, 0, ""},
 17473  		{"Kaithi", Var, 0, ""},
 17474  		{"Kannada", Var, 0, ""},
 17475  		{"Katakana", Var, 0, ""},
 17476  		{"Kawi", Var, 21, ""},
 17477  		{"Kayah_Li", Var, 0, ""},
 17478  		{"Kharoshthi", Var, 0, ""},
 17479  		{"Khitan_Small_Script", Var, 16, ""},
 17480  		{"Khmer", Var, 0, ""},
 17481  		{"Khojki", Var, 4, ""},
 17482  		{"Khudawadi", Var, 4, ""},
 17483  		{"L", Var, 0, ""},
 17484  		{"LC", Var, 25, ""},
 17485  		{"Lao", Var, 0, ""},
 17486  		{"Latin", Var, 0, ""},
 17487  		{"Lepcha", Var, 0, ""},
 17488  		{"Letter", Var, 0, ""},
 17489  		{"Limbu", Var, 0, ""},
 17490  		{"Linear_A", Var, 4, ""},
 17491  		{"Linear_B", Var, 0, ""},
 17492  		{"Lisu", Var, 0, ""},
 17493  		{"Ll", Var, 0, ""},
 17494  		{"Lm", Var, 0, ""},
 17495  		{"Lo", Var, 0, ""},
 17496  		{"Logical_Order_Exception", Var, 0, ""},
 17497  		{"Lower", Var, 0, ""},
 17498  		{"LowerCase", Const, 0, ""},
 17499  		{"Lt", Var, 0, ""},
 17500  		{"Lu", Var, 0, ""},
 17501  		{"Lycian", Var, 0, ""},
 17502  		{"Lydian", Var, 0, ""},
 17503  		{"M", Var, 0, ""},
 17504  		{"Mahajani", Var, 4, ""},
 17505  		{"Makasar", Var, 13, ""},
 17506  		{"Malayalam", Var, 0, ""},
 17507  		{"Mandaic", Var, 0, ""},
 17508  		{"Manichaean", Var, 4, ""},
 17509  		{"Marchen", Var, 7, ""},
 17510  		{"Mark", Var, 0, ""},
 17511  		{"Masaram_Gondi", Var, 10, ""},
 17512  		{"MaxASCII", Const, 0, ""},
 17513  		{"MaxCase", Const, 0, ""},
 17514  		{"MaxLatin1", Const, 0, ""},
 17515  		{"MaxRune", Const, 0, ""},
 17516  		{"Mc", Var, 0, ""},
 17517  		{"Me", Var, 0, ""},
 17518  		{"Medefaidrin", Var, 13, ""},
 17519  		{"Meetei_Mayek", Var, 0, ""},
 17520  		{"Mende_Kikakui", Var, 4, ""},
 17521  		{"Meroitic_Cursive", Var, 1, ""},
 17522  		{"Meroitic_Hieroglyphs", Var, 1, ""},
 17523  		{"Miao", Var, 1, ""},
 17524  		{"Mn", Var, 0, ""},
 17525  		{"Modi", Var, 4, ""},
 17526  		{"Mongolian", Var, 0, ""},
 17527  		{"Mro", Var, 4, ""},
 17528  		{"Multani", Var, 5, ""},
 17529  		{"Myanmar", Var, 0, ""},
 17530  		{"N", Var, 0, ""},
 17531  		{"Nabataean", Var, 4, ""},
 17532  		{"Nag_Mundari", Var, 21, ""},
 17533  		{"Nandinagari", Var, 14, ""},
 17534  		{"Nd", Var, 0, ""},
 17535  		{"New_Tai_Lue", Var, 0, ""},
 17536  		{"Newa", Var, 7, ""},
 17537  		{"Nko", Var, 0, ""},
 17538  		{"Nl", Var, 0, ""},
 17539  		{"No", Var, 0, ""},
 17540  		{"Noncharacter_Code_Point", Var, 0, ""},
 17541  		{"Number", Var, 0, ""},
 17542  		{"Nushu", Var, 10, ""},
 17543  		{"Nyiakeng_Puachue_Hmong", Var, 14, ""},
 17544  		{"Ogham", Var, 0, ""},
 17545  		{"Ol_Chiki", Var, 0, ""},
 17546  		{"Old_Hungarian", Var, 5, ""},
 17547  		{"Old_Italic", Var, 0, ""},
 17548  		{"Old_North_Arabian", Var, 4, ""},
 17549  		{"Old_Permic", Var, 4, ""},
 17550  		{"Old_Persian", Var, 0, ""},
 17551  		{"Old_Sogdian", Var, 13, ""},
 17552  		{"Old_South_Arabian", Var, 0, ""},
 17553  		{"Old_Turkic", Var, 0, ""},
 17554  		{"Old_Uyghur", Var, 21, ""},
 17555  		{"Oriya", Var, 0, ""},
 17556  		{"Osage", Var, 7, ""},
 17557  		{"Osmanya", Var, 0, ""},
 17558  		{"Other", Var, 0, ""},
 17559  		{"Other_Alphabetic", Var, 0, ""},
 17560  		{"Other_Default_Ignorable_Code_Point", Var, 0, ""},
 17561  		{"Other_Grapheme_Extend", Var, 0, ""},
 17562  		{"Other_ID_Continue", Var, 0, ""},
 17563  		{"Other_ID_Start", Var, 0, ""},
 17564  		{"Other_Lowercase", Var, 0, ""},
 17565  		{"Other_Math", Var, 0, ""},
 17566  		{"Other_Uppercase", Var, 0, ""},
 17567  		{"P", Var, 0, ""},
 17568  		{"Pahawh_Hmong", Var, 4, ""},
 17569  		{"Palmyrene", Var, 4, ""},
 17570  		{"Pattern_Syntax", Var, 0, ""},
 17571  		{"Pattern_White_Space", Var, 0, ""},
 17572  		{"Pau_Cin_Hau", Var, 4, ""},
 17573  		{"Pc", Var, 0, ""},
 17574  		{"Pd", Var, 0, ""},
 17575  		{"Pe", Var, 0, ""},
 17576  		{"Pf", Var, 0, ""},
 17577  		{"Phags_Pa", Var, 0, ""},
 17578  		{"Phoenician", Var, 0, ""},
 17579  		{"Pi", Var, 0, ""},
 17580  		{"Po", Var, 0, ""},
 17581  		{"Prepended_Concatenation_Mark", Var, 7, ""},
 17582  		{"PrintRanges", Var, 0, ""},
 17583  		{"Properties", Var, 0, ""},
 17584  		{"Ps", Var, 0, ""},
 17585  		{"Psalter_Pahlavi", Var, 4, ""},
 17586  		{"Punct", Var, 0, ""},
 17587  		{"Quotation_Mark", Var, 0, ""},
 17588  		{"Radical", Var, 0, ""},
 17589  		{"Range16", Type, 0, ""},
 17590  		{"Range16.Hi", Field, 0, ""},
 17591  		{"Range16.Lo", Field, 0, ""},
 17592  		{"Range16.Stride", Field, 0, ""},
 17593  		{"Range32", Type, 0, ""},
 17594  		{"Range32.Hi", Field, 0, ""},
 17595  		{"Range32.Lo", Field, 0, ""},
 17596  		{"Range32.Stride", Field, 0, ""},
 17597  		{"RangeTable", Type, 0, ""},
 17598  		{"RangeTable.LatinOffset", Field, 1, ""},
 17599  		{"RangeTable.R16", Field, 0, ""},
 17600  		{"RangeTable.R32", Field, 0, ""},
 17601  		{"Regional_Indicator", Var, 10, ""},
 17602  		{"Rejang", Var, 0, ""},
 17603  		{"ReplacementChar", Const, 0, ""},
 17604  		{"Runic", Var, 0, ""},
 17605  		{"S", Var, 0, ""},
 17606  		{"STerm", Var, 0, ""},
 17607  		{"Samaritan", Var, 0, ""},
 17608  		{"Saurashtra", Var, 0, ""},
 17609  		{"Sc", Var, 0, ""},
 17610  		{"Scripts", Var, 0, ""},
 17611  		{"Sentence_Terminal", Var, 7, ""},
 17612  		{"Sharada", Var, 1, ""},
 17613  		{"Shavian", Var, 0, ""},
 17614  		{"Siddham", Var, 4, ""},
 17615  		{"SignWriting", Var, 5, ""},
 17616  		{"SimpleFold", Func, 0, "func(r rune) rune"},
 17617  		{"Sinhala", Var, 0, ""},
 17618  		{"Sk", Var, 0, ""},
 17619  		{"Sm", Var, 0, ""},
 17620  		{"So", Var, 0, ""},
 17621  		{"Soft_Dotted", Var, 0, ""},
 17622  		{"Sogdian", Var, 13, ""},
 17623  		{"Sora_Sompeng", Var, 1, ""},
 17624  		{"Soyombo", Var, 10, ""},
 17625  		{"Space", Var, 0, ""},
 17626  		{"SpecialCase", Type, 0, ""},
 17627  		{"Sundanese", Var, 0, ""},
 17628  		{"Syloti_Nagri", Var, 0, ""},
 17629  		{"Symbol", Var, 0, ""},
 17630  		{"Syriac", Var, 0, ""},
 17631  		{"Tagalog", Var, 0, ""},
 17632  		{"Tagbanwa", Var, 0, ""},
 17633  		{"Tai_Le", Var, 0, ""},
 17634  		{"Tai_Tham", Var, 0, ""},
 17635  		{"Tai_Viet", Var, 0, ""},
 17636  		{"Takri", Var, 1, ""},
 17637  		{"Tamil", Var, 0, ""},
 17638  		{"Tangsa", Var, 21, ""},
 17639  		{"Tangut", Var, 7, ""},
 17640  		{"Telugu", Var, 0, ""},
 17641  		{"Terminal_Punctuation", Var, 0, ""},
 17642  		{"Thaana", Var, 0, ""},
 17643  		{"Thai", Var, 0, ""},
 17644  		{"Tibetan", Var, 0, ""},
 17645  		{"Tifinagh", Var, 0, ""},
 17646  		{"Tirhuta", Var, 4, ""},
 17647  		{"Title", Var, 0, ""},
 17648  		{"TitleCase", Const, 0, ""},
 17649  		{"To", Func, 0, "func(_case int, r rune) rune"},
 17650  		{"ToLower", Func, 0, "func(r rune) rune"},
 17651  		{"ToTitle", Func, 0, "func(r rune) rune"},
 17652  		{"ToUpper", Func, 0, "func(r rune) rune"},
 17653  		{"Toto", Var, 21, ""},
 17654  		{"TurkishCase", Var, 0, ""},
 17655  		{"Ugaritic", Var, 0, ""},
 17656  		{"Unified_Ideograph", Var, 0, ""},
 17657  		{"Upper", Var, 0, ""},
 17658  		{"UpperCase", Const, 0, ""},
 17659  		{"UpperLower", Const, 0, ""},
 17660  		{"Vai", Var, 0, ""},
 17661  		{"Variation_Selector", Var, 0, ""},
 17662  		{"Version", Const, 0, ""},
 17663  		{"Vithkuqi", Var, 21, ""},
 17664  		{"Wancho", Var, 14, ""},
 17665  		{"Warang_Citi", Var, 4, ""},
 17666  		{"White_Space", Var, 0, ""},
 17667  		{"Yezidi", Var, 16, ""},
 17668  		{"Yi", Var, 0, ""},
 17669  		{"Z", Var, 0, ""},
 17670  		{"Zanabazar_Square", Var, 10, ""},
 17671  		{"Zl", Var, 0, ""},
 17672  		{"Zp", Var, 0, ""},
 17673  		{"Zs", Var, 0, ""},
 17674  	},
 17675  	"unicode/utf16": {
 17676  		{"AppendRune", Func, 20, "func(a []uint16, r rune) []uint16"},
 17677  		{"Decode", Func, 0, "func(s []uint16) []rune"},
 17678  		{"DecodeRune", Func, 0, "func(r1 rune, r2 rune) rune"},
 17679  		{"Encode", Func, 0, "func(s []rune) []uint16"},
 17680  		{"EncodeRune", Func, 0, "func(r rune) (r1 rune, r2 rune)"},
 17681  		{"IsSurrogate", Func, 0, "func(r rune) bool"},
 17682  		{"RuneLen", Func, 23, "func(r rune) int"},
 17683  	},
 17684  	"unicode/utf8": {
 17685  		{"AppendRune", Func, 18, "func(p []byte, r rune) []byte"},
 17686  		{"DecodeLastRune", Func, 0, "func(p []byte) (r rune, size int)"},
 17687  		{"DecodeLastRuneInString", Func, 0, "func(s string) (r rune, size int)"},
 17688  		{"DecodeRune", Func, 0, "func(p []byte) (r rune, size int)"},
 17689  		{"DecodeRuneInString", Func, 0, "func(s string) (r rune, size int)"},
 17690  		{"EncodeRune", Func, 0, "func(p []byte, r rune) int"},
 17691  		{"FullRune", Func, 0, "func(p []byte) bool"},
 17692  		{"FullRuneInString", Func, 0, "func(s string) bool"},
 17693  		{"MaxRune", Const, 0, ""},
 17694  		{"RuneCount", Func, 0, "func(p []byte) int"},
 17695  		{"RuneCountInString", Func, 0, "func(s string) (n int)"},
 17696  		{"RuneError", Const, 0, ""},
 17697  		{"RuneLen", Func, 0, "func(r rune) int"},
 17698  		{"RuneSelf", Const, 0, ""},
 17699  		{"RuneStart", Func, 0, "func(b byte) bool"},
 17700  		{"UTFMax", Const, 0, ""},
 17701  		{"Valid", Func, 0, "func(p []byte) bool"},
 17702  		{"ValidRune", Func, 1, "func(r rune) bool"},
 17703  		{"ValidString", Func, 0, "func(s string) bool"},
 17704  	},
 17705  	"unique": {
 17706  		{"(Handle).Value", Method, 23, ""},
 17707  		{"Handle", Type, 23, ""},
 17708  		{"Make", Func, 23, "func[T comparable](value T) Handle[T]"},
 17709  	},
 17710  	"unsafe": {
 17711  		{"Add", Func, 0, ""},
 17712  		{"Alignof", Func, 0, ""},
 17713  		{"Offsetof", Func, 0, ""},
 17714  		{"Pointer", Type, 0, ""},
 17715  		{"Sizeof", Func, 0, ""},
 17716  		{"Slice", Func, 0, ""},
 17717  		{"SliceData", Func, 0, ""},
 17718  		{"String", Func, 0, ""},
 17719  		{"StringData", Func, 0, ""},
 17720  	},
 17721  	"weak": {
 17722  		{"(Pointer).Value", Method, 24, ""},
 17723  		{"Make", Func, 24, "func[T any](ptr *T) Pointer[T]"},
 17724  		{"Pointer", Type, 24, ""},
 17725  	},
 17726  }
 17727  
View as plain text