Excel e所有键HKLM\SYSTEM\CurrentControlSet\Enum\DISPLAY\ iRC=oRegistry.EnumKey(HKLM、sBaseKey、ARSUBKEY) 对于Arsubkey中的每个sKey “我们现在的注册级别为: 'H

Excel e所有键HKLM\SYSTEM\CurrentControlSet\Enum\DISPLAY\ iRC=oRegistry.EnumKey(HKLM、sBaseKey、ARSUBKEY) 对于Arsubkey中的每个sKey “我们现在的注册级别为: 'H,excel,vbscript,Excel,Vbscript,e所有键HKLM\SYSTEM\CurrentControlSet\Enum\DISPLAY\ iRC=oRegistry.EnumKey(HKLM、sBaseKey、ARSUBKEY) 对于Arsubkey中的每个sKey “我们现在的注册级别为: 'HKLM\SYSTEM\CurrentControlSet\Enum\DISPLAY\0然后 tmpser=配平(左侧(tmp、仪表(tmp、chr和H0a))-1)) 其他的 tmpser=微调(tmp) 如果结束 “虽然它不是edid规范的一

e所有键HKLM\SYSTEM\CurrentControlSet\Enum\DISPLAY\ iRC=oRegistry.EnumKey(HKLM、sBaseKey、ARSUBKEY) 对于Arsubkey中的每个sKey “我们现在的注册级别为: 'HKLM\SYSTEM\CurrentControlSet\Enum\DISPLAY\0然后 tmpser=配平(左侧(tmp、仪表(tmp、chr和H0a))-1)) 其他的 tmpser=微调(tmp) 如果结束 “虽然它不是edid规范的一部分,但似乎 '序列号通常会在&H00之前,这是 "补偿" 如果左(tmpser,1)=chr(0),则tmpser=右(tmpser,len(tmpser)-1) 其他的 tmpser=“未找到” 如果结束 '如果找到包含型号块的位置,则将其存储 如果intMdlFoundAt-1,则 tmp=右侧(位置(intMdlFoundAt),14) 如果仪表(tmp、chr和H0a))>0,则 tmpmdl=微调(左(tmp、仪表(tmp、chr和H0a))-1) 其他的 tmpmdl=微调(tmp) 如果结束 “虽然它不是edid规范的一部分,但似乎 '序列号通常会在&H00之前,这是 "补偿" 如果左(tmpmdl,1)=chr(0),则tmpmdl=右(tmpmdl,len(tmpmdl)-1) 其他的 tmpmdl=“未找到” 如果结束 '************************************************************** '下一步获取制造日期 '************************************************************** Dim tmpmfgweek、tmpmfgyear、tmpmdt “生产周存储在EDID offset&H10中 tmpmfgweek=asc(中期(Strarrawedd(tmpctr)和H10+1,1)) “制造年份存储在EDID offset&H11中 现在是一九九零年 tmpmfgyear=(asc(中期(Strarrawedid(tmpctr)和H11+1,1))+1990年 '以月/年格式存储 tmpmdt=month(dateadd(“ww”、tmpmfgweek、datevalue(“1/1/”&tmpmfgyar))&“/”和tmpmfgyar '************************************************************** '下一步获取edid版本 '************************************************************** '版本位于EDID偏移量&H12 调光TMPEDDMAJORVER、TMPEDDREV、tmpVer tmpEDIDMajorVer=asc(mid(STRARRAWEDID(tmpctr)和H12+1,1)) “修订级别为EDID偏移量&H13 tmpEDIDRev=asc(mid(STRARRAWEDID(tmpctr)和H13+1,1)) '以月/年格式存储 tmpver=chr(48+tmpeddmajorver)&“&chr(48+tmpeddrev) '************************************************************** '下一步获取制造商id '************************************************************** '制造商id是从EDID偏移量&H08开始的2个字节 'id有三个字符长。使用5位表示 '每个字符。使用这些位是为了使1=A 2=B等。。 ' “获取数据 尺寸tmpMfg,tmpMfg 暗淡的Char1,Char2,Char3 暗淡字节1,字节2 tmpEDIDMfg=mid(STRARRAWEDID(tmpctr)和H08+1,2) Char1=0:Char2=0:Char3=0 Byte1=asc(左(tmpEDIDMfg,1))'获取字符串的前半部分 Byte2=asc(右(tmpEDIDMfg,1))'获取字符串的前半部分 “现在换位子 '将64位移到16位 如果(字节1和64)>0,则Char1=Char1+16 '将32位移到8位 如果(字节1和32)>0,则Char1=Char1+8 “等等。。。。 如果(字节1和16)>0,则Char1=Char1+4 如果(字节1和字节8)>0,则Char1=Char1+2 如果(字节1和字节4)>0,则Char1=Char1+1 '第2个字符使用第1字节的2位和1位 如果(字节1和字节2)>0,则Char2=Char2+16 如果(字节1和1)>0,则Char2=Char2+8 '和第2字节的128、64和32位 如果(字节2和128)>0,则Char2=Char2+4 如果(字节2和64)>0,则Char2=Char2+2 如果(字节2和32)>0,则Char2=Char2+1 '第三个字符的位不需要移位 “我们可以按原样使用它们 Char3=Char3+(字节2和16) Char3=Char3+(字节2和字节8) Char3=Char3+(字节2和字节4) Char3=Char3+(字节2和字节2) Char3=Char3+(字节2和1) tmpmfg=chr(Char1+64)&chr(Char2+64)&chr(Char3+64) '************************************************************** '下一步获取设备id '************************************************************** '设备id为2字节,从EDID偏移量&H0a开始 '字节的顺序相反。 '此代码不是文本。它只是一个分配的2字节代码 “由制造商提供。它们应该是模型所特有的 变光tmpEDIDDev1、tmpEDIDDev2、tmpDev tmpEDIDDev1=十六进制(asc(mid(STRARRAWEDID(tmpctr),&H0a+1,1))) tmpEDIDDev2=十六进制(asc(中间(StrarRawedId,tmpctr)和H0b+1,1))) 如果len(tmpEDIDDev1)=1,则tmpEDIDDev1=“0”&tmpEDIDDev1 如果len(tmpEDIDDev2)=1,则tmpEDIDDev2=“0”&tmpEDIDDev2 tmpdev=tmpEDIDDev2和tmpEDIDDev1 '************************************************************** '最后将所有值存储到数组中 '************************************************************** “Kaplan添加代码以避免重复。。。 如果不是InArray(tmpser,arrMonitorInfo,3),则 arrMonitorInfo(tmpctr,0)=tmpmfg arrMonitorInfo(tmpctr,1)=tmpdev arrMonitorInfo(tmpctr,2)=tmpmdt arrMonitorInfo(tmpctr,3)=tmpser arrMonitorInfo(tmpctr,4)=tmpmdl arrMonitorInfo(tmpctr,5)=tmpVer 如果结束 如果结束 下一个 “现在只是一个简单的问题
        strComputer = inputbox("Type the name of the computer with out \\ or an IP address to find out the service tag")
    rem strComputer = "10.12.102.109"
    if strComputer = "" then wscript.quit

    Set objWMIService = GetObject("winmgmts:" & "{impersonationLevel=impersonate}!\\" & strComputer & "\root\cimv2")

    Set colSMBIOS = objWMIService.ExecQuery ("Select * from Win32_SystemEnclosure")
    For Each objSMBIOS in colSMBIOS
    rem    Wscript.Echo "Service tag (serial number): " & objSMBIOS.SerialNumber
         strSN = objSMBIOS.SerialNumber
    Next

    rem strComputer = "."

    Set objSWbemServices = GetObject("winmgmts:\\" & strComputer)
    Set colSWbemObjectSet = _
        objSWbemServices.InstancesOf("Win32_LogicalMemoryConfiguration")

    For Each objSWbemObject In colSWbemObjectSet
    rem    Wscript.Echo "Total Physical Memory (kb): " & _
    rem        objSWbemObject.TotalPhysicalMemory
            strMemory = objSWbemObject.TotalPhysicalMemory
    Next



    Set colOperatingSystems = objSWbemServices.InstancesOf("Win32_OperatingSystem")

    For Each objOperatingSystem In colOperatingSystems
       OSName = objOperatingSystem.Name 
       OSVersion = objOperatingSystem.Version        
       OSSevPac= objOperatingSystem.ServicePackMajorVersion & _
            "." & objOperatingSystem.ServicePackMinorVersion      
    Next




    Set objWMIService = GetObject("winmgmts:" _
        & "{impersonationLevel=impersonate}!\\" & strComputer & "\root\cimv2")
    Set colSettings = objWMIService.ExecQuery _
        ("SELECT * FROM Win32_OperatingSystem")
    For Each objOperatingSystem in colSettings
        AvaMem =   objOperatingSystem.FreePhysicalMemory
    Next
    Set colSettings = objWMIService.ExecQuery _
        ("SELECT * FROM Win32_ComputerSystem")
    For Each objComputer in colSettings
        CmpNam = objComputer.Name
        CmpMnf = objComputer.Manufacturer
        CmpMdl = objComputer.Model
    Next
    Set colSettings = objWMIService.ExecQuery _
        ("SELECT * FROM Win32_Processor")
    For Each objProcessor in colSettings
        PrcDsc =  objProcessor.Description
    Next
    Set colSettings = objWMIService.ExecQuery _
        ("SELECT * FROM Win32_BIOS")
    For Each objBIOS in colSettings
        BIOS = objBIOS.Version
    Next

    Rem --------------------

Set colAdapters = objWMIService.ExecQuery _
("Select * From Win32_NetworkAdapterConfiguration Where IPEnabled = True")


For Each oAdapter in colAdapters
   For Each sIPAddress in oAdapter.IPAddress
    If sIPAddress <>  "0.0.0.0"  Then 
        IP = sIPAddress 
        MAC = oAdapter.MACAddress
        EXIT FOR
    End If
   Next
Next

Rem

rem ____________________
MsgBox  "Hardware" & vbCrLf & _
    "   Service Tag:        " & strSN & vbCrLf & _
    "   Total Memory(KB):       " & strMemory & vbCrLf  & _
        "   Available Memory(KB):   " & AvaMem & vbCrLf & _
        "   Computer Name:      "  & CmpNam & vbCrLf  & _
        "   System Manufacturer:    " & CmpMnf & vbCrLf  & _
        "   System Model:       " & CmpMdl & vbCrLf  & _
        "   Processor:      " & PrcDsc & vbCrLf  & _
    "   BIOS Version:       " & BIOS & vbCrLf  & vbCrLf & _
    "OS"  & vbCrLf & _      
    "   OS Name:                " & OSName   & vbCrLf & _
        "   Version:                " & OSVersion         & vbCrLf & _
        "   Service Pack:           " & OSSevPac & vbCrLf  & vbCrLf &_
    "   Network"  & vbCrLf & _      
    "   IP Address:     " & IP & vbcrlf & _
    "   MAC:            " & MAC _
 ,0, strComputer &  "  - System Information" 
Rem
'
'==========================================================================

Option Explicit
Dim WshShell
Set WshShell = WScript.CreateObject("WScript.Shell")
Dim strComputer, message

Dim intMonitorCount
Dim oRegistry, sBaseKey, sBaseKey2, sBaseKey3, skey, skey2, skey3
Dim sValue
dim i, iRC, iRC2, iRC3
Dim arSubKeys, arSubKeys2, arSubKeys3, arrintEDID
Dim strRawEDID
Dim ByteValue, strSerFind, strMdlFind
Dim intSerFoundAt, intMdlFoundAt, findit
Dim tmp, tmpser, tmpmdl, tmpctr
Dim batch, bHeader
batch = False

If WScript.Arguments.Count = 1 Then
    strComputer = WScript.Arguments(0)
    batch = True
Else
    strComputer = wshShell.ExpandEnvironmentStrings("%COMPUTERNAME%")
    strComputer = InputBox("Check Monitor info for what PC","PC Name?",strComputer)
End If 

If strcomputer = "" Then WScript.Quit
strComputer = UCase(strComputer)

If batch Then 
    Dim fso,logfile, appendout
    logfile = wshShell.ExpandEnvironmentStrings("%userprofile%") & "\desktop\MonitorInfo.csv"

    'setup Log
    Const ForAppend = 8
    Set fso = CreateObject("Scripting.FileSystemObject")
    If Not fso.FileExists(logfile) Then bHeader = True
    set appendout = fso.OpenTextFile(logfile, ForAppend, True)

    If bHeader Then 
        appendout.writeline "Computer,Model,Serial #,Vendor ID,Manufacture Date,Messages"
    End If 
End If 

Dim strarrRawEDID()
intMonitorCount=0
Const HKLM = &H80000002 'HKEY_LOCAL_MACHINE
'get a handle to the WMI registry object
On Error Resume Next
Set oRegistry = GetObject("winmgmts:{impersonationLevel=impersonate}!\\" & strComputer & "/root/default:StdRegProv")

If Err <> 0 Then
    If batch Then 
        EchoAndLog strComputer & ",,,,," & Err.Description
    Else
        MsgBox "Failed. " & Err.Description,vbCritical + vbOKOnly,strComputer
        WScript.Quit
    End If 
End If 


sBaseKey = "SYSTEM\CurrentControlSet\Enum\DISPLAY\"
'enumerate all the keys HKLM\SYSTEM\CurrentControlSet\Enum\DISPLAY\
iRC = oRegistry.EnumKey(HKLM, sBaseKey, arSubKeys)
For Each sKey In arSubKeys
     'we are now in the registry at the level of:
     'HKLM\SYSTEM\CurrentControlSet\Enum\DISPLAY\<VESA_Monitor_ID\
     'we need to dive in one more level and check the data of the "HardwareID" value
    sBaseKey2 = sBaseKey & sKey & "\"
    iRC2 = oRegistry.EnumKey(HKLM, sBaseKey2, arSubKeys2)
    For Each sKey2 In arSubKeys2
          'now we are at the level of:
          'HKLM\SYSTEM\CurrentControlSet\Enum\DISPLAY\<VESA_Monitor_ID\<PNP_ID>\
          'so we can check the "HardwareID" value
        oRegistry.GetMultiStringValue HKLM, sBaseKey2 & sKey2 & "\", "HardwareID", sValue
        for tmpctr=0 to ubound(svalue)
            If lcase(left(svalue(tmpctr),8))="monitor\" then
                    'If it is a monitor we will check for the existance of a control subkey
                    'that way we know it is an active monitor
                    sBaseKey3 = sBaseKey2 & sKey2 & "\"
                    iRC3 = oRegistry.EnumKey(HKLM, sBaseKey3, arSubKeys3)
                    For Each sKey3 In arSubKeys3
                    'Kaplan edit
                    strRawEDID = ""
                         If skey3="Control" Then
                              'If the Control sub-key exists then we should read the edid info
                              oRegistry.GetBinaryValue HKLM, sbasekey3 & "Device Parameters\", "EDID", arrintEDID
                           If vartype(arrintedid) <> 8204 then 'and If we don't find it...
                                   strRawEDID="EDID Not Available" 'store an "unavailable message
                              else
                                   for each bytevalue in arrintedid 'otherwise conver the byte array from the registry into a string (for easier processing later)
                                        strRawEDID=strRawEDID & chr(bytevalue)
                                   Next
                              End If
                              'now take the string and store it in an array, that way we can support multiple monitors
                              redim preserve strarrRawEDID(intMonitorCount)
                              strarrRawEDID(intMonitorCount)=strRawEDID
                              intMonitorCount=intMonitorCount+1
                          End If
                    Next
            End If
        Next    
    Next     
Next
'*****************************************************************************************
'now the EDID info for each active monitor is stored in an array of strings called strarrRawEDID
'so we can process it to get the good stuff out of it which we will store in a 5 dimensional array
'called arrMonitorInfo, the dimensions are as follows:
'0=VESA Mfg ID, 1=VESA Device ID, 2=MFG Date (M/YYYY),3=Serial Num (If available),4=Model Descriptor
'5=EDID Version
'*****************************************************************************************
On Error Resume Next 
dim arrMonitorInfo()
redim arrMonitorInfo(intMonitorCount-1,5)
dim location(3)
for tmpctr=0 to intMonitorCount-1
     If strarrRawEDID(tmpctr) <> "EDID Not Available" then
          '*********************************************************************
          'first get the model and serial numbers from the vesa descriptor
          'blocks in the edid.  the model number is required to be present
          'according to the spec. (v1.2 and beyond)but serial number is not
          'required.  There are 4 descriptor blocks in edid at offset locations
          '&H36 &H48 &H5a and &H6c each block is 18 bytes long
          '*********************************************************************
          location(0)=mid(strarrRawEDID(tmpctr),&H36+1,18)
          location(1)=mid(strarrRawEDID(tmpctr),&H48+1,18)
          location(2)=mid(strarrRawEDID(tmpctr),&H5a+1,18)
          location(3)=mid(strarrRawEDID(tmpctr),&H6c+1,18)

          'you can tell If the location contains a serial number If it starts with &H00 00 00 ff
          strSerFind=chr(&H00) & chr(&H00) & chr(&H00) & chr(&Hff)
          'or a model description If it starts with &H00 00 00 fc
          strMdlFind=chr(&H00) & chr(&H00) & chr(&H00) & chr(&Hfc)

          intSerFoundAt=-1
          intMdlFoundAt=-1
          for findit = 0 to 3
               If instr(location(findit),strSerFind)>0 then
                    intSerFoundAt=findit
               End If
               If instr(location(findit),strMdlFind)>0 then
                    intMdlFoundAt=findit
               End If
          Next

          'If a location containing a serial number block was found then store it
          If intSerFoundAt<>-1 then
               tmp=right(location(intSerFoundAt),14)
               If instr(tmp,chr(&H0a))>0 then
                    tmpser=trim(left(tmp,instr(tmp,chr(&H0a))-1))
               Else
                    tmpser=trim(tmp)
               End If
               'although it is not part of the edid spec it seems as though the
               'serial number will frequently be preceeded by &H00, this
               'compensates for that
               If left(tmpser,1)=chr(0) then tmpser=right(tmpser,len(tmpser)-1)
          else
               tmpser="Not Found"
          End If

          'If a location containing a model number block was found then store it
          If intMdlFoundAt<>-1 then
               tmp=right(location(intMdlFoundAt),14)
               If instr(tmp,chr(&H0a))>0 then
                    tmpmdl=trim(left(tmp,instr(tmp,chr(&H0a))-1))
               else
                    tmpmdl=trim(tmp)
               End If
               'although it is not part of the edid spec it seems as though the
               'serial number will frequently be preceeded by &H00, this
               'compensates for that
               If left(tmpmdl,1)=chr(0) then tmpmdl=right(tmpmdl,len(tmpmdl)-1)
          else
               tmpmdl="Not Found"
          End If

          '**************************************************************
          'Next get the mfg date
          '**************************************************************
          Dim tmpmfgweek,tmpmfgyear,tmpmdt
          'the week of manufacture is stored at EDID offset &H10
          tmpmfgweek=asc(mid(strarrRawEDID(tmpctr),&H10+1,1))

          'the year of manufacture is stored at EDID offset &H11
          'and is the current year -1990
          tmpmfgyear=(asc(mid(strarrRawEDID(tmpctr),&H11+1,1)))+1990

          'store it in month/year format          
          tmpmdt=month(dateadd("ww",tmpmfgweek,datevalue("1/1/" & tmpmfgyear))) & "/" & tmpmfgyear

          '**************************************************************
          'Next get the edid version
          '**************************************************************
          'the version is at EDID offset &H12
          Dim tmpEDIDMajorVer, tmpEDIDRev, tmpVer
          tmpEDIDMajorVer=asc(mid(strarrRawEDID(tmpctr),&H12+1,1))

          'the revision level is at EDID offset &H13
          tmpEDIDRev=asc(mid(strarrRawEDID(tmpctr),&H13+1,1))

          'store it in month/year format          
          tmpver=chr(48+tmpEDIDMajorVer) & "." & chr(48+tmpEDIDRev)

          '**************************************************************
          'Next get the mfg id
          '**************************************************************
          'the mfg id is 2 bytes starting at EDID offset &H08
          'the id is three characters long.  using 5 bits to represent
          'each character.  the bits are used so that 1=A 2=B etc..
          '
          'get the data
          Dim tmpEDIDMfg, tmpMfg
          dim Char1, Char2, Char3
          Dim Byte1, Byte2
          tmpEDIDMfg=mid(strarrRawEDID(tmpctr),&H08+1,2)          
          Char1=0 : Char2=0 : Char3=0 
          Byte1=asc(left(tmpEDIDMfg,1)) 'get the first half of the string 
          Byte2=asc(right(tmpEDIDMfg,1)) 'get the first half of the string
          'now shift the bits
          'shift the 64 bit to the 16 bit
          If (Byte1 and 64) > 0 then Char1=Char1+16 
          'shift the 32 bit to the 8 bit
          If (Byte1 and 32) > 0 then Char1=Char1+8 
          'etc....
          If (Byte1 and 16) > 0 then Char1=Char1+4 
          If (Byte1 and 8) > 0 then Char1=Char1+2 
          If (Byte1 and 4) > 0 then Char1=Char1+1 

          'the 2nd character uses the 2 bit and the 1 bit of the 1st byte
          If (Byte1 and 2) > 0 then Char2=Char2+16 
          If (Byte1 and 1) > 0 then Char2=Char2+8 
          'and the 128,64 and 32 bits of the 2nd byte
          If (Byte2 and 128) > 0 then Char2=Char2+4 
          If (Byte2 and 64) > 0 then Char2=Char2+2 
          If (Byte2 and 32) > 0 then Char2=Char2+1 

          'the bits for the 3rd character don't need shifting
          'we can use them as they are
          Char3=Char3+(Byte2 and 16) 
          Char3=Char3+(Byte2 and 8) 
          Char3=Char3+(Byte2 and 4) 
          Char3=Char3+(Byte2 and 2) 
          Char3=Char3+(Byte2 and 1) 
          tmpmfg=chr(Char1+64) & chr(Char2+64) & chr(Char3+64)

          '**************************************************************
          'Next get the device id
          '**************************************************************
          'the device id is 2bytes starting at EDID offset &H0a
          'the bytes are in reverse order.
          'this code is not text.  it is just a 2 byte code assigned
          'by the manufacturer.  they should be unique to a model
          Dim tmpEDIDDev1, tmpEDIDDev2, tmpDev

          tmpEDIDDev1=hex(asc(mid(strarrRawEDID(tmpctr),&H0a+1,1)))
          tmpEDIDDev2=hex(asc(mid(strarrRawEDID(tmpctr),&H0b+1,1)))
          If len(tmpEDIDDev1)=1 then tmpEDIDDev1="0" & tmpEDIDDev1
          If len(tmpEDIDDev2)=1 then tmpEDIDDev2="0" & tmpEDIDDev2
          tmpdev=tmpEDIDDev2 & tmpEDIDDev1

          '**************************************************************
          'finally store all the values into the array
          '**************************************************************
          'Kaplan adds code to avoid duplication...

          If Not InArray(tmpser,arrMonitorInfo,3) Then 
              arrMonitorInfo(tmpctr,0)=tmpmfg
              arrMonitorInfo(tmpctr,1)=tmpdev
              arrMonitorInfo(tmpctr,2)=tmpmdt
              arrMonitorInfo(tmpctr,3)=tmpser
              arrMonitorInfo(tmpctr,4)=tmpmdl
              arrMonitorInfo(tmpctr,5)=tmpVer
          End If 
     End If
Next

'For now just a simple screen print will suffice for output.
'But you could take this output and write it to a database or a file
'and in that way use it for asset management.
i = 0
for tmpctr = 0 to intMonitorCount-1
     If arrMonitorInfo(tmpctr,1) <> "" And arrMonitorInfo(tmpctr,0) <> "PNP" Then 
         If batch Then
             EchoAndLog strComputer & "," & arrMonitorInfo(tmpctr,4) & "," & _
             arrMonitorInfo(tmpctr,3)& "," & arrMonitorInfo(tmpctr,0) & "," & _
             arrMonitorInfo(tmpctr,2)
          Else
             message =  message & "Monitor " & chr(i+65) & ")" & VbCrLf & _
             "Model Name: " & arrMonitorInfo(tmpctr,4) & VbCrLf & _
             "Serial Number: " & arrMonitorInfo(tmpctr,3)& VbCrLf & _
             "VESA Manufacturer ID: " & arrMonitorInfo(tmpctr,0) & VbCrLf & _
             "Manufacture Date: " & arrMonitorInfo(tmpctr,2) & VbCrLf & VbCrLf 
             'wscript.echo ".........." & "Device ID: " & arrMonitorInfo(tmpctr,1)
             'wscript.echo ".........." & "EDID Version: " & arrMonitorInfo(tmpctr,5)
                 i = i + 1
         End If 
     End If 
Next

If not batch Then
    MsgBox message, vbInformation + vbOKOnly,strComputer & " Monitor Info"
End If 

Function InArray(strValue,List,Col)
    Dim i
    For i = 0 to UBound(List)
        If List(i,col) = cstr(strValue) Then
            InArray = True
            Exit Function
        End If
    Next
    InArray = False 
End Function

Sub EchoAndLog (message)
'Echo output and write to log
    Wscript.Echo message
    AppendOut.WriteLine message
End Sub
Const ADS_SCOPE_SUBTREE = 2

Set conn = CreateObject("ADODB.Connection")
Set cmd =   CreateObject("ADODB.Command")
conn.Provider = "ADsDSOObject"
conn.Open "Active Directory Provider"
Set cmd.ActiveConnection = conn

cmd.Properties("Page Size") = 1000
cmd.Properties("Searchscope") = ADS_SCOPE_SUBTREE 

cmd.CommandText = "SELECT Name FROM 'LDAP://dc=test,dc=com' WHERE objectCategory='computer'"
Set rec = cmd.Execute

rec.MoveFirst
Do Until rec.EOF
    Wscript.Echo rec.Fields("Name").Value
    rec.MoveNext
Loop