[VB6] Réseau local

Réseau local [VB6] - VB/VBA/VBS - Programmation

Marsh Posté le 19-06-2002 à 10:41:05    

Comment faire pour lister (dans un ComboBox notamment) les PCs présents sur le réseau local ? A noter que je n'ai pas besoin de récupérer les dossier partagés ... ; juste les noms des PC
 
Des idées ?


Message édité par MossieurPropre le 19-06-2002 à 11:13:09
Reply

Marsh Posté le 19-06-2002 à 10:41:05   

Reply

Marsh Posté le 19-06-2002 à 10:50:47    

up car aussi intéressé

Reply

Marsh Posté le 19-06-2002 à 13:53:33    

MossieurPropre a écrit a écrit :

Comment faire pour lister (dans un ComboBox notamment) les PCs présents sur le réseau local ? A noter que je n'ai pas besoin de récupérer les dossier partagés ... ; juste les noms des PC
 
Des idées ?  




 
Avec une api windows, c'est encore le seul moyen que je connaisse pour arriver à cécupérer les noms de volumes...et les noms des ordinateurs présent...seulement, je crains que l'API ne détecte seulement le nom de la machine contenant le combo...
 
A mon avis pour palier à cela, tu installe des fichiers "PATCH" sur les machines en questions, tu les éxécutes et tu devrais arriver à récupérer le nom des machines...sans certitude !
 
je ne vois pas d'autres solution, à moins de détecter également tous les lecteurs sur ta machine (avec une API), enfin bon je ne vois pas trop...
 
 :jap: @+


---------------
;) Bienvenue sur le site...:)             http://perso.wanadoo.fr/rapport
Reply

Marsh Posté le 19-06-2002 à 13:55:25    

un ptit netstat?

Reply

Marsh Posté le 19-06-2002 à 14:39:20    

nasdak a écrit a écrit :

un ptit netstat?  




 
ouais il parait kon peut le faire, afin d'ensuite renvoyer les informations dans un fichier pour ensuite l'ouvrir dans VB ...
 
Mais g oublié la commande :/


---------------
www.novemberguitars.com
Reply

Marsh Posté le 19-06-2002 à 14:55:18    

Si tu veux passer par un fichier intermédiaire tu peux faire un .bat contenant :
net view > hosts_file.tmp
 
Et sous VB tu fais :
Shell "truc.bat",vbHide
 
Mais c'est pas top comme méthode...  :(

Reply

Marsh Posté le 19-06-2002 à 14:58:47    

El Scorcho a écrit a écrit :

Si tu veux passer par un fichier intermédiaire tu peux faire un .bat contenant :
net view > hosts_file.tmp
 
Et sous VB tu fais :
Shell "truc.bat",vbHide
 
Mais c'est pas top comme méthode...  :(  




 
si ça marche c le principal :hello:
 
Je vais essayer


---------------
www.novemberguitars.com
Reply

Marsh Posté le 19-06-2002 à 14:59:01    

et tant pis pour la combobox


---------------
www.novemberguitars.com
Reply

Marsh Posté le 19-06-2002 à 15:01:40    

Après tu peux lire le contenu de hosts_file.tmp et récupérer les infos intéressantes pour les mettre dans une combo...
Le seul pb est qu'il faut mettre en place un système permettant de savoir que le bat a fini de s'exécuter...

Reply

Marsh Posté le 19-06-2002 à 15:36:46    

El Scorcho a écrit a écrit :

Après tu peux lire le contenu de hosts_file.tmp et récupérer les infos intéressantes pour les mettre dans une combo...
Le seul pb est qu'il faut mettre en place un système permettant de savoir que le bat a fini de s'exécuter...  




 
mouais, je vais faire des tests (un bouton "Refresh", par exemple)


---------------
www.novemberguitars.com
Reply

Marsh Posté le 19-06-2002 à 15:36:46   

Reply

Marsh Posté le 23-06-2002 à 10:59:15    

:bounce: , problème résolu a l'aide de net view :)
 
Si des personnes veulent le code pour afficher les PC dans une combobox, demandez-moi.


---------------
www.novemberguitars.com
Reply

Marsh Posté le 25-06-2002 à 16:02:04    

MossieurPropre a écrit a écrit :

:bounce: , problème résolu a l'aide de net view :)
 
Si des personnes veulent le code pour afficher les PC dans une combobox, demandez-moi.  




 
vivi ca m'interresse  :ouch: allé fais toi pas prier misterproper :hap: thanks

Reply

Marsh Posté le 25-06-2002 à 21:25:04    

Dim fso As New FileSystemObject, file1 As File
pat = App.Path
chdir pat
nb = shell("nv.exe", 1)
'nv.exe est un programme en QBasic qui permet
'de lancer net view >nb.tmp et de faire attendre
'l'utilisateur 2 secondes pendant que WIndows
'se magne a écrire le fichier nb.tmp
 
Set file1 = fso.GetFile(pat & "\nb.tmp" )    'on ouvre le fichier
Set ts = file1.OpenAsTextStream(ForReading) 'idem
S = ts.ReadLine
S = ts.ReadLine    'on saute les lignes qui ne contiennent pas  
S = ts.ReadLine    'd'infos utiles, soit les 3 premières.
i:                      'début de la boucle de reconnaissance des PC
S = ts.ReadLine         'on lit la ligne
pref1 = Left(S, 2)      'on regarde les 2 premiers caractères de cette ligne
Select Case pref1
    Case "\\":          'si la ligne commence par \\ on la garde
    Longueur = Len(S)              'début du traitement du nom du PC
    Name = Right(S, Longueur - 2)  'visant a retirer le \\ devant (voir le fichier nb.temp)
    Form1.Combo1.AddItem Name      'on ajoute le nom du PC dans le combobox
    Case Else: GoTo j              'Si jamais la ligne ne commence pas par \\ (fin de fichier), on  
End Select                         'quitte la boucle
GoTo i
j:
ts.Close 'on ferme le fichier


 
c pas très très élégant mais ça fonctionne au poil :)


Message édité par MossieurPropre le 25-06-2002 à 21:25:33

---------------
www.novemberguitars.com
Reply

Marsh Posté le 26-06-2002 à 01:09:14    

arf ! j'attendais de voir le code, car j'ai fait une app pour le boulot qui devait copier des données a traver un réseau. Je listais toutes les machines d'un domaine donnée et les partages (cachés ou non) pour la copie. Je vais tenter de retrouver le code, je reposterais pour un lien direct vers les src parce que je trouve ta méthode pas du tout élégante si je puis me permettre :)

Reply

Marsh Posté le 26-06-2002 à 15:19:49    

KarLKoX a écrit a écrit :

arf ! j'attendais de voir le code, car j'ai fait une app pour le boulot qui devait copier des données a traver un réseau. Je listais toutes les machines d'un domaine donnée et les partages (cachés ou non) pour la copie. Je vais tenter de retrouver le code, je reposterais pour un lien direct vers les src parce que je trouve ta méthode pas du tout élégante si je puis me permettre :)




 
je sais je sais :/


---------------
www.novemberguitars.com
Reply

Marsh Posté le 26-06-2002 à 15:33:53    

Code :
  1. '--------------------------------------------------------------
  2. ' Copyright ©1996-2002 VBnet, Randy Birch, All Rights Reserved.
  3. ' Terms of use http://www.mvps.org/vbnet/terms/pages/terms.htm
  4. '--------------------------------------------------------------
  5. 'from LMMSG.H
  6. Private Const MAX_PREFERRED_LENGTH As Long = -1
  7. Private Const NERR_SUCCESS As Long = 0&
  8. Private Const ERROR_MORE_DATA As Long = 234&
  9. Private Const SV_TYPE_WORKSTATION         As Long = &H1
  10. Private Const SV_TYPE_SERVER              As Long = &H2
  11. Private Const SV_TYPE_SQLSERVER           As Long = &H4
  12. Private Const SV_TYPE_DOMAIN_CTRL         As Long = &H8
  13. Private Const SV_TYPE_DOMAIN_BAKCTRL      As Long = &H10
  14. Private Const SV_TYPE_TIME_SOURCE         As Long = &H20
  15. Private Const SV_TYPE_AFP                 As Long = &H40
  16. Private Const SV_TYPE_NOVELL              As Long = &H80
  17. Private Const SV_TYPE_DOMAIN_MEMBER       As Long = &H100
  18. Private Const SV_TYPE_PRINTQ_SERVER       As Long = &H200
  19. Private Const SV_TYPE_DIALIN_SERVER       As Long = &H400
  20. Private Const SV_TYPE_XENIX_SERVER        As Long = &H800
  21. Private Const SV_TYPE_SERVER_UNIX         As Long = SV_TYPE_XENIX_SERVER
  22. Private Const SV_TYPE_NT                  As Long = &H1000
  23. Private Const SV_TYPE_WFW                 As Long = &H2000
  24. Private Const SV_TYPE_SERVER_MFPN         As Long = &H4000
  25. Private Const SV_TYPE_SERVER_NT           As Long = &H8000
  26. Private Const SV_TYPE_POTENTIAL_BROWSER   As Long = &H10000
  27. Private Const SV_TYPE_BACKUP_BROWSER      As Long = &H20000
  28. Private Const SV_TYPE_MASTER_BROWSER      As Long = &H40000
  29. Private Const SV_TYPE_DOMAIN_MASTER       As Long = &H80000
  30. Private Const SV_TYPE_SERVER_OSF          As Long = &H100000
  31. Private Const SV_TYPE_SERVER_VMS          As Long = &H200000
  32. Private Const SV_TYPE_WINDOWS             As Long = &H400000  'Windows95 and above
  33. Private Const SV_TYPE_DFS                 As Long = &H800000  'Root of a DFS tree
  34. Private Const SV_TYPE_CLUSTER_NT          As Long = &H1000000 'NT Cluster
  35. Private Const SV_TYPE_TERMINALSERVER      As Long = &H2000000 'Terminal Server
  36. Private Const SV_TYPE_DCE                 As Long = &H10000000 'IBM DSS
  37. Private Const SV_TYPE_ALTERNATE_XPORT     As Long = &H20000000 'rtn alternate transport
  38. Private Const SV_TYPE_LOCAL_LIST_ONLY     As Long = &H40000000 'rtn local only
  39. Private Const SV_TYPE_DOMAIN_ENUM         As Long = &H80000000
  40. Private Const SV_TYPE_ALL                 As Long = &HFFFFFFFF
  41. Private Const SV_PLATFORM_ID_OS2       As Long = 400
  42. Private Const SV_PLATFORM_ID_NT        As Long = 500
  43. 'Mask applied to svX_version_major in
  44. 'order to obtain the major version number.
  45. Private Const MAJOR_VERSION_MASK        As Long = &HF
  46. Private Type SERVER_INFO_100
  47.     sv100_platform_id As Long
  48.     sv100_name As Long
  49. End Type
  50. Private Declare Function NetServerEnum Lib "netapi32" _
  51.         (ByVal servername As Long, _
  52.         ByVal level As Long, _
  53.         buf As Any, _
  54.         ByVal prefmaxlen As Long, _
  55.         entriesread As Long, _
  56.         totalentries As Long, _
  57.         ByVal servertype As Long, _
  58.         ByVal domain As Long, _
  59.         resume_handle As Long) As Long
  60. Private Declare Function NetApiBufferFree Lib "netapi32" _
  61.         (ByVal Buffer As Long) As Long
  62. Private Declare Sub CopyMemory Lib "kernel32" _
  63.         Alias "RtlMoveMemory" _
  64.         (pTo As Any, uFrom As Any, _
  65.         ByVal lSize As Long)
  66. Private Declare Function lstrlenW Lib "kernel32" _
  67.         (ByVal lpString As Long) As Long
  68. Private Const ERROR_ACCESS_DENIED As Long = 5
  69. Private Const ERROR_BAD_NETPATH As Long = 53
  70. Private Const ERROR_INVALID_PARAMETER As Long = 87
  71. Private Const ERROR_NOT_SUPPORTED As Long = 50
  72. Private Const ERROR_INVALID_NAME As Long = 123
  73. Private Const NERR_BASE As Long = 2100
  74. Private Const NERR_NetworkError As Long = (NERR_BASE + 36)
  75. Private Const NERR_NameNotFound As Long = (NERR_BASE + 173)
  76. Private Const NERR_UseNotFound As Long = (NERR_BASE + 150)
  77. Private Const MAX_COMPUTERNAME As Long = 15
  78. Private Const VER_PLATFORM_WIN32s As Long = 0
  79. Private Const VER_PLATFORM_WIN32_WINDOWS As Long = 1
  80. Private Const VER_PLATFORM_WIN32_NT As Long = 2
  81. Private Type OSVERSIONINFO
  82.     OSVSize         As Long
  83.     dwVerMajor      As Long
  84.     dwVerMinor      As Long
  85.     dwBuildNumber   As Long
  86.     PlatformID      As Long
  87.     szCSDVersion    As String * 128
  88. End Type
  89. 'User-defined type for passing
  90. 'the data to the Send function
  91. Private Type NetMessageData
  92.     sServerName As String
  93.     sSendTo As String
  94.     sSendFrom As String
  95.     sMessage As String
  96. End Type
  97. 'NetMessageBufferSend parameters:
  98. 'servername:  Unicode string specifying the name of the
  99. '             remote server on which the function is to
  100. '             execute. If this parameter is vbNullString,
  101. '             the local computer is used.
  102. '
  103. 'msgname:     Unicode string specifying the message alias to
  104. '             which the message buffer should be sent.
  105. '
  106. 'fromname:    Unicode string specifying who the message is from.
  107. '             This parameter is required to send interrupting messages
  108. '             from the computer name. If this parameter is NULL, the
  109. '             message is sent from the logged-on user.
  110. '
  111. 'msgbuf:      Unicode string containing the message to send.
  112. '
  113. 'msgbuflen:   value that contains the length, in bytes, of
  114. '             the message text pointed to by the msgbuf parameter.
  115. Private Declare Function NetMessageBufferSend Lib "netapi32" _
  116.         (ByVal servername As String, _
  117.         ByVal msgname As String, _
  118.         ByVal fromname As String, _
  119.         ByVal msgbuf As String, _
  120.         ByRef msgbuflen As Long) As Long
  121. Private Declare Function GetComputerName Lib "kernel32" _
  122.         Alias "GetComputerNameA" _
  123.         (ByVal lpBuffer As String, _
  124.         nSize As Long) As Long
  125. Private Declare Function GetVersionEx Lib "kernel32" _
  126.         Alias "GetVersionExA" _
  127.         (lpVersionInformation As OSVERSIONINFO) As Long
  128. Private Sub Form_Load()
  129.     Dim tmp As String
  130.     'pre-load the text boxes with
  131.     'the local computer name for testing
  132.     tmp = Space$(MAX_COMPUTERNAME + 1)
  133.     Call GetComputerName(tmp, Len(tmp))
  134.     Text1.Text = TrimNull(tmp)
  135.     Text3.Text = TrimNull(tmp)
  136.     Call GetServers(vbNullString)
  137. End Sub
  138. Private Sub Command1_Click()
  139.     Dim msgData As NetMessageData
  140.     Dim sSuccess As String
  141.     For i = 0 To List1.ListCount - 1
  142.         If List1.Selected(i) Then
  143.             With msgData
  144.                 .sServerName = Text1.Text
  145.                 .sSendTo = List1.List(i)
  146.                 .sSendFrom = Text3.Text
  147.                 .sMessage = Text4.Text
  148.             End With
  149.             sSuccess = NetSendMessage(msgData)
  150.         End If
  151.     Next
  152.     StatusBar1.Panels(2).Text = sSuccess
  153. End Sub
  154. Private Function IsWinNT() As Boolean
  155.     'returns True if running WinNT/Win2000/WinXP
  156.     #If Win32 Then
  157.         Dim OSV As OSVERSIONINFO
  158.         OSV.OSVSize = Len(OSV)
  159.         If GetVersionEx(OSV) = 1 Then
  160.             'PlatformId contains a value representing the OS.
  161.             IsWinNT = (OSV.PlatformID = VER_PLATFORM_WIN32_NT)
  162.         End If
  163.     #End If
  164. End Function
  165. Private Function NetSendMessage(msgData As NetMessageData) As String
  166.     Dim success As Long
  167.     'assure that the OS is NT ..
  168.     'NetMessageBufferSend  can not
  169.     'be called on Win9x
  170.     If IsWinNT() Then
  171.         With msgData
  172.             'if To name omitted return error and exit
  173.             If .sSendTo = "" Then
  174.                 NetSendMessage = GetNetSendMessageStatus(ERROR_INVALID_PARAMETER)
  175.                 Exit Function
  176.             Else
  177.                 'if there is a message
  178.                 If Len(.sMessage) Then
  179.                     'convert the strings to unicode
  180.                     .sSendTo = StrConv(.sSendTo, vbUnicode)
  181.                     .sMessage = StrConv(.sMessage, vbUnicode)
  182.                     'Note that the API could be called passing
  183.                     'vbNullString as the SendFrom and sServerName
  184.                     'strings. This would generate the message on
  185.                     'the sending machine.
  186.                     If Len(.sServerName) > 0 Then
  187.                         .sServerName = StrConv(.sServerName, vbUnicode)
  188.                         Else: .sServerName = vbNullString
  189.                     End If
  190.                     If Len(.sSendFrom) > 0 Then
  191.                         .sSendFrom = StrConv(.sSendFrom, vbUnicode)
  192.                         Else: .sSendFrom = vbNullString
  193.                     End If
  194.                     'change the cursor and show. Control won't return
  195.                     'until the call has completed.
  196.                     Screen.MousePointer = vbHourglass
  197.                     success = NetMessageBufferSend(.sServerName, _
  198.                             .sSendTo, _
  199.                             .sSendFrom, _
  200.                             .sMessage, _
  201.                             ByVal Len(.sMessage))
  202.                     Screen.MousePointer = vbNormal
  203.                     NetSendMessage = GetNetSendMessageStatus(success)
  204.                 End If 'If Len(.sMessage)
  205.             End If  'If .sSendTo
  206.         End With  'With msgData
  207.     End If  'If IsWinNT
  208. End Function
  209. Private Function GetNetSendMessageStatus(nError As Long) As String
  210.     Dim msg As String
  211.     Select Case nError
  212.         Case NERR_SUCCESS:            msg = "The message was successfully sent"
  213.         Case NERR_NameNotFound:       msg = "Send To not found"
  214.         Case NERR_NetworkError:       msg = "General network error occurred"
  215.         Case NERR_UseNotFound:        msg = "Network connection not found"
  216.         Case ERROR_ACCESS_DENIED:     msg = "Access to computer denied"
  217.         Case ERROR_BAD_NETPATH:       msg = "Sent From server name not found."
  218.         Case ERROR_INVALID_PARAMETER: msg = "Invalid parameter(s) specified."
  219.         Case ERROR_NOT_SUPPORTED:     msg = "Network request not supported."
  220.         Case ERROR_INVALID_NAME:      msg = "Illegal character or malformed name."
  221.         Case Else:                    msg = "Unknown error executing command."
  222.     End Select
  223.     GetNetSendMessageStatus = msg
  224. End Function
  225. Private Function TrimNull(item As String)
  226.     'return string before the terminating null
  227.     Dim pos As Integer
  228.     pos = InStr(item, Chr$(0))
  229.     If pos Then
  230.         TrimNull = Left$(item, pos - 1)
  231.         Else: TrimNull = item
  232.     End If
  233. End Function
  234. Private Function GetServers(sDomain As String) As Long
  235.     'lists all servers of the specified type
  236.     'that are visible in a domain.
  237.     Dim bufptr          As Long
  238.     Dim dwEntriesread   As Long
  239.     Dim dwTotalentries  As Long
  240.     Dim dwResumehandle  As Long
  241.     Dim se100           As SERVER_INFO_100
  242.     Dim success         As Long
  243.     Dim nStructSize     As Long
  244.     Dim cnt             As Long
  245.     nStructSize = LenB(se100)
  246.     'Call passing MAX_PREFERRED_LENGTH to have the
  247.     'API allocate required memory for the return values.
  248.     '
  249.     'The call is enumerating all machines on the
  250.     'network (SV_TYPE_ALL); however, by Or'ing
  251.     'specific bit masks for defined types you can
  252.     'customize the returned data. For example, a
  253.     'value of 0x00000003 combines the bit masks for
  254.     'SV_TYPE_WORKSTATION (0x00000001) and
  255.     'SV_TYPE_SERVER (0x00000002).
  256.     '
  257.     'dwServerName must be Null. The level parameter
  258.     '(100 here) specifies the data structure being
  259.     'used (in this case a SERVER_INFO_100 structure).
  260.     '
  261.     'The domain member is passed as Null, indicating
  262.     'machines on the primary domain are to be retrieved.
  263.     'If you decide to use this member, pass
  264.     'StrPtr("domain name" ), not the string itself.
  265.     success = NetServerEnum(0&, _
  266.             100, _
  267.             bufptr, _
  268.             MAX_PREFERRED_LENGTH, _
  269.             dwEntriesread, _
  270.             dwTotalentries, _
  271.             SV_TYPE_ALL, _
  272.             0&, _
  273.             dwResumehandle)
  274.     'if all goes well
  275.     If success = NERR_SUCCESS And _
  276.             success <> ERROR_MORE_DATA Then
  277.         'loop through the returned data, adding each
  278.         'machine to the list
  279.         For cnt = 0 To dwEntriesread - 1
  280.             'get one chunk of data and cast
  281.             'into an SERVER_INFO_100 struct
  282.             'in order to add the name to a list
  283.             CopyMemory se100, ByVal bufptr + (nStructSize * cnt), nStructSize
  284.             List1.AddItem GetPointerToByteStringW(se100.sv100_name)
  285.         Next
  286.     End If
  287.     'clean up regardless of success
  288.     Call NetApiBufferFree(bufptr)
  289.     'return entries as sign of success
  290.     GetServers = dwEntriesread
  291. End Function
  292. Public Function GetPointerToByteStringW(ByVal dwData As Long) As String
  293.     Dim tmp() As Byte
  294.     Dim tmplen As Long
  295.     If dwData <> 0 Then
  296.         tmplen = lstrlenW(dwData) * 2
  297.         If tmplen <> 0 Then
  298.             ReDim tmp(0 To (tmplen - 1)) As Byte
  299.             CopyMemory tmp(0), ByVal dwData, tmplen
  300.             GetPointerToByteStringW = tmp
  301.         End If
  302.     End If
  303. End Function


 
fonction en api
met un list view
 
sinon c sure pplanet source code
dans les news en vb

Reply

Marsh Posté le 26-06-2002 à 15:48:11    

the real mask a écrit a écrit :

Code :
  1. '--------------------------------------------------------------
  2. ' Copyright ©1996-2002 VBnet, Randy Birch, All Rights Reserved.
  3. ' Terms of use http://www.mvps.org/vbnet/terms/pages/terms.htm
  4. '--------------------------------------------------------------
  5. 'from LMMSG.H
  6. Private Const MAX_PREFERRED_LENGTH As Long = -1
  7. Private Const NERR_SUCCESS As Long = 0&
  8. Private Const ERROR_MORE_DATA As Long = 234&
  9. Private Const SV_TYPE_WORKSTATION         As Long = &H1
  10. Private Const SV_TYPE_SERVER              As Long = &H2
  11. Private Const SV_TYPE_SQLSERVER           As Long = &H4
  12. Private Const SV_TYPE_DOMAIN_CTRL         As Long = &H8
  13. Private Const SV_TYPE_DOMAIN_BAKCTRL      As Long = &H10
  14. Private Const SV_TYPE_TIME_SOURCE         As Long = &H20
  15. Private Const SV_TYPE_AFP                 As Long = &H40
  16. Private Const SV_TYPE_NOVELL              As Long = &H80
  17. Private Const SV_TYPE_DOMAIN_MEMBER       As Long = &H100
  18. Private Const SV_TYPE_PRINTQ_SERVER       As Long = &H200
  19. Private Const SV_TYPE_DIALIN_SERVER       As Long = &H400
  20. Private Const SV_TYPE_XENIX_SERVER        As Long = &H800
  21. Private Const SV_TYPE_SERVER_UNIX         As Long = SV_TYPE_XENIX_SERVER
  22. Private Const SV_TYPE_NT                  As Long = &H1000
  23. Private Const SV_TYPE_WFW                 As Long = &H2000
  24. Private Const SV_TYPE_SERVER_MFPN         As Long = &H4000
  25. Private Const SV_TYPE_SERVER_NT           As Long = &H8000
  26. Private Const SV_TYPE_POTENTIAL_BROWSER   As Long = &H10000
  27. Private Const SV_TYPE_BACKUP_BROWSER      As Long = &H20000
  28. Private Const SV_TYPE_MASTER_BROWSER      As Long = &H40000
  29. Private Const SV_TYPE_DOMAIN_MASTER       As Long = &H80000
  30. Private Const SV_TYPE_SERVER_OSF          As Long = &H100000
  31. Private Const SV_TYPE_SERVER_VMS          As Long = &H200000
  32. Private Const SV_TYPE_WINDOWS             As Long = &H400000  'Windows95 and above
  33. Private Const SV_TYPE_DFS                 As Long = &H800000  'Root of a DFS tree
  34. Private Const SV_TYPE_CLUSTER_NT          As Long = &H1000000 'NT Cluster
  35. Private Const SV_TYPE_TERMINALSERVER      As Long = &H2000000 'Terminal Server
  36. Private Const SV_TYPE_DCE                 As Long = &H10000000 'IBM DSS
  37. Private Const SV_TYPE_ALTERNATE_XPORT     As Long = &H20000000 'rtn alternate transport
  38. Private Const SV_TYPE_LOCAL_LIST_ONLY     As Long = &H40000000 'rtn local only
  39. Private Const SV_TYPE_DOMAIN_ENUM         As Long = &H80000000
  40. Private Const SV_TYPE_ALL                 As Long = &HFFFFFFFF
  41. Private Const SV_PLATFORM_ID_OS2       As Long = 400
  42. Private Const SV_PLATFORM_ID_NT        As Long = 500
  43. 'Mask applied to svX_version_major in
  44. 'order to obtain the major version number.
  45. Private Const MAJOR_VERSION_MASK        As Long = &HF
  46. Private Type SERVER_INFO_100
  47.     sv100_platform_id As Long
  48.     sv100_name As Long
  49. End Type
  50. Private Declare Function NetServerEnum Lib "netapi32" _
  51.         (ByVal servername As Long, _
  52.         ByVal level As Long, _
  53.         buf As Any, _
  54.         ByVal prefmaxlen As Long, _
  55.         entriesread As Long, _
  56.         totalentries As Long, _
  57.         ByVal servertype As Long, _
  58.         ByVal domain As Long, _
  59.         resume_handle As Long) As Long
  60. Private Declare Function NetApiBufferFree Lib "netapi32" _
  61.         (ByVal Buffer As Long) As Long
  62. Private Declare Sub CopyMemory Lib "kernel32" _
  63.         Alias "RtlMoveMemory" _
  64.         (pTo As Any, uFrom As Any, _
  65.         ByVal lSize As Long)
  66. Private Declare Function lstrlenW Lib "kernel32" _
  67.         (ByVal lpString As Long) As Long
  68. Private Const ERROR_ACCESS_DENIED As Long = 5
  69. Private Const ERROR_BAD_NETPATH As Long = 53
  70. Private Const ERROR_INVALID_PARAMETER As Long = 87
  71. Private Const ERROR_NOT_SUPPORTED As Long = 50
  72. Private Const ERROR_INVALID_NAME As Long = 123
  73. Private Const NERR_BASE As Long = 2100
  74. Private Const NERR_NetworkError As Long = (NERR_BASE + 36)
  75. Private Const NERR_NameNotFound As Long = (NERR_BASE + 173)
  76. Private Const NERR_UseNotFound As Long = (NERR_BASE + 150)
  77. Private Const MAX_COMPUTERNAME As Long = 15
  78. Private Const VER_PLATFORM_WIN32s As Long = 0
  79. Private Const VER_PLATFORM_WIN32_WINDOWS As Long = 1
  80. Private Const VER_PLATFORM_WIN32_NT As Long = 2
  81. Private Type OSVERSIONINFO
  82.     OSVSize         As Long
  83.     dwVerMajor      As Long
  84.     dwVerMinor      As Long
  85.     dwBuildNumber   As Long
  86.     PlatformID      As Long
  87.     szCSDVersion    As String * 128
  88. End Type
  89. 'User-defined type for passing
  90. 'the data to the Send function
  91. Private Type NetMessageData
  92.     sServerName As String
  93.     sSendTo As String
  94.     sSendFrom As String
  95.     sMessage As String
  96. End Type
  97. 'NetMessageBufferSend parameters:
  98. 'servername:  Unicode string specifying the name of the
  99. '             remote server on which the function is to
  100. '             execute. If this parameter is vbNullString,
  101. '             the local computer is used.
  102. '
  103. 'msgname:     Unicode string specifying the message alias to
  104. '             which the message buffer should be sent.
  105. '
  106. 'fromname:    Unicode string specifying who the message is from.
  107. '             This parameter is required to send interrupting messages
  108. '             from the computer name. If this parameter is NULL, the
  109. '             message is sent from the logged-on user.
  110. '
  111. 'msgbuf:      Unicode string containing the message to send.
  112. '
  113. 'msgbuflen:   value that contains the length, in bytes, of
  114. '             the message text pointed to by the msgbuf parameter.
  115. Private Declare Function NetMessageBufferSend Lib "netapi32" _
  116.         (ByVal servername As String, _
  117.         ByVal msgname As String, _
  118.         ByVal fromname As String, _
  119.         ByVal msgbuf As String, _
  120.         ByRef msgbuflen As Long) As Long
  121. Private Declare Function GetComputerName Lib "kernel32" _
  122.         Alias "GetComputerNameA" _
  123.         (ByVal lpBuffer As String, _
  124.         nSize As Long) As Long
  125. Private Declare Function GetVersionEx Lib "kernel32" _
  126.         Alias "GetVersionExA" _
  127.         (lpVersionInformation As OSVERSIONINFO) As Long
  128. Private Sub Form_Load()
  129.     Dim tmp As String
  130.     'pre-load the text boxes with
  131.     'the local computer name for testing
  132.     tmp = Space$(MAX_COMPUTERNAME + 1)
  133.     Call GetComputerName(tmp, Len(tmp))
  134.     Text1.Text = TrimNull(tmp)
  135.     Text3.Text = TrimNull(tmp)
  136.     Call GetServers(vbNullString)
  137. End Sub
  138. Private Sub Command1_Click()
  139.     Dim msgData As NetMessageData
  140.     Dim sSuccess As String
  141.     For i = 0 To List1.ListCount - 1
  142.         If List1.Selected(i) Then
  143.             With msgData
  144.                 .sServerName = Text1.Text
  145.                 .sSendTo = List1.List(i)
  146.                 .sSendFrom = Text3.Text
  147.                 .sMessage = Text4.Text
  148.             End With
  149.             sSuccess = NetSendMessage(msgData)
  150.         End If
  151.     Next
  152.     StatusBar1.Panels(2).Text = sSuccess
  153. End Sub
  154. Private Function IsWinNT() As Boolean
  155.     'returns True if running WinNT/Win2000/WinXP
  156.     #If Win32 Then
  157.         Dim OSV As OSVERSIONINFO
  158.         OSV.OSVSize = Len(OSV)
  159.         If GetVersionEx(OSV) = 1 Then
  160.             'PlatformId contains a value representing the OS.
  161.             IsWinNT = (OSV.PlatformID = VER_PLATFORM_WIN32_NT)
  162.         End If
  163.     #End If
  164. End Function
  165. Private Function NetSendMessage(msgData As NetMessageData) As String
  166.     Dim success As Long
  167.     'assure that the OS is NT ..
  168.     'NetMessageBufferSend  can not
  169.     'be called on Win9x
  170.     If IsWinNT() Then
  171.         With msgData
  172.             'if To name omitted return error and exit
  173.             If .sSendTo = "" Then
  174.                 NetSendMessage = GetNetSendMessageStatus(ERROR_INVALID_PARAMETER)
  175.                 Exit Function
  176.             Else
  177.                 'if there is a message
  178.                 If Len(.sMessage) Then
  179.                     'convert the strings to unicode
  180.                     .sSendTo = StrConv(.sSendTo, vbUnicode)
  181.                     .sMessage = StrConv(.sMessage, vbUnicode)
  182.                     'Note that the API could be called passing
  183.                     'vbNullString as the SendFrom and sServerName
  184.                     'strings. This would generate the message on
  185.                     'the sending machine.
  186.                     If Len(.sServerName) > 0 Then
  187.                         .sServerName = StrConv(.sServerName, vbUnicode)
  188.                         Else: .sServerName = vbNullString
  189.                     End If
  190.                     If Len(.sSendFrom) > 0 Then
  191.                         .sSendFrom = StrConv(.sSendFrom, vbUnicode)
  192.                         Else: .sSendFrom = vbNullString
  193.                     End If
  194.                     'change the cursor and show. Control won't return
  195.                     'until the call has completed.
  196.                     Screen.MousePointer = vbHourglass
  197.                     success = NetMessageBufferSend(.sServerName, _
  198.                             .sSendTo, _
  199.                             .sSendFrom, _
  200.                             .sMessage, _
  201.                             ByVal Len(.sMessage))
  202.                     Screen.MousePointer = vbNormal
  203.                     NetSendMessage = GetNetSendMessageStatus(success)
  204.                 End If 'If Len(.sMessage)
  205.             End If  'If .sSendTo
  206.         End With  'With msgData
  207.     End If  'If IsWinNT
  208. End Function
  209. Private Function GetNetSendMessageStatus(nError As Long) As String
  210.     Dim msg As String
  211.     Select Case nError
  212.         Case NERR_SUCCESS:            msg = "The message was successfully sent"
  213.         Case NERR_NameNotFound:       msg = "Send To not found"
  214.         Case NERR_NetworkError:       msg = "General network error occurred"
  215.         Case NERR_UseNotFound:        msg = "Network connection not found"
  216.         Case ERROR_ACCESS_DENIED:     msg = "Access to computer denied"
  217.         Case ERROR_BAD_NETPATH:       msg = "Sent From server name not found."
  218.         Case ERROR_INVALID_PARAMETER: msg = "Invalid parameter(s) specified."
  219.         Case ERROR_NOT_SUPPORTED:     msg = "Network request not supported."
  220.         Case ERROR_INVALID_NAME:      msg = "Illegal character or malformed name."
  221.         Case Else:                    msg = "Unknown error executing command."
  222.     End Select
  223.     GetNetSendMessageStatus = msg
  224. End Function
  225. Private Function TrimNull(item As String)
  226.     'return string before the terminating null
  227.     Dim pos As Integer
  228.     pos = InStr(item, Chr$(0))
  229.     If pos Then
  230.         TrimNull = Left$(item, pos - 1)
  231.         Else: TrimNull = item
  232.     End If
  233. End Function
  234. Private Function GetServers(sDomain As String) As Long
  235.     'lists all servers of the specified type
  236.     'that are visible in a domain.
  237.     Dim bufptr          As Long
  238.     Dim dwEntriesread   As Long
  239.     Dim dwTotalentries  As Long
  240.     Dim dwResumehandle  As Long
  241.     Dim se100           As SERVER_INFO_100
  242.     Dim success         As Long
  243.     Dim nStructSize     As Long
  244.     Dim cnt             As Long
  245.     nStructSize = LenB(se100)
  246.     'Call passing MAX_PREFERRED_LENGTH to have the
  247.     'API allocate required memory for the return values.
  248.     '
  249.     'The call is enumerating all machines on the
  250.     'network (SV_TYPE_ALL); however, by Or'ing
  251.     'specific bit masks for defined types you can
  252.     'customize the returned data. For example, a
  253.     'value of 0x00000003 combines the bit masks for
  254.     'SV_TYPE_WORKSTATION (0x00000001) and
  255.     'SV_TYPE_SERVER (0x00000002).
  256.     '
  257.     'dwServerName must be Null. The level parameter
  258.     '(100 here) specifies the data structure being
  259.     'used (in this case a SERVER_INFO_100 structure).
  260.     '
  261.     'The domain member is passed as Null, indicating
  262.     'machines on the primary domain are to be retrieved.
  263.     'If you decide to use this member, pass
  264.     'StrPtr("domain name" ), not the string itself.
  265.     success = NetServerEnum(0&, _
  266.             100, _
  267.             bufptr, _
  268.             MAX_PREFERRED_LENGTH, _
  269.             dwEntriesread, _
  270.             dwTotalentries, _
  271.             SV_TYPE_ALL, _
  272.             0&, _
  273.             dwResumehandle)
  274.     'if all goes well
  275.     If success = NERR_SUCCESS And _
  276.             success <> ERROR_MORE_DATA Then
  277.         'loop through the returned data, adding each
  278.         'machine to the list
  279.         For cnt = 0 To dwEntriesread - 1
  280.             'get one chunk of data and cast
  281.             'into an SERVER_INFO_100 struct
  282.             'in order to add the name to a list
  283.             CopyMemory se100, ByVal bufptr + (nStructSize * cnt), nStructSize
  284.             List1.AddItem GetPointerToByteStringW(se100.sv100_name)
  285.         Next
  286.     End If
  287.     'clean up regardless of success
  288.     Call NetApiBufferFree(bufptr)
  289.     'return entries as sign of success
  290.     GetServers = dwEntriesread
  291. End Function
  292. Public Function GetPointerToByteStringW(ByVal dwData As Long) As String
  293.     Dim tmp() As Byte
  294.     Dim tmplen As Long
  295.     If dwData <> 0 Then
  296.         tmplen = lstrlenW(dwData) * 2
  297.         If tmplen <> 0 Then
  298.             ReDim tmp(0 To (tmplen - 1)) As Byte
  299.             CopyMemory tmp(0), ByVal dwData, tmplen
  300.             GetPointerToByteStringW = tmp
  301.         End If
  302.     End If
  303. End Function


 
fonction en api
met un list view
 
sinon c sure pplanet source code
dans les news en vb
 




 
[:wam]
 
je préfère le miens, lé + court kan même ...


---------------
www.novemberguitars.com
Reply

Sujets relatifs:

Leave a Replay

Make sure you enter the(*)required information where indicate.HTML code is not allowed