看流星社区

 找回密码
 注册账号
查看: 3977|回复: 6

[VB] 发一些VB代码,帮助大家自己写的辅助能更好的运用

[复制链接]

该用户从未签到

发表于 2011-4-7 07:31:39 | 显示全部楼层 |阅读模式
[VB]如何遍历当前windows的所有窗口
以下模块:
Private Declare Function FindWindowEx Lib "user32" Alias "FindWindowExA" (ByVal hWnd1 As Long, ByVal hWnd2 As Long, ByVal lpsz1 As String, ByVal lpsz2 As String) As Long
Private Declare Function GetParent Lib "user32" (ByVal hwnd As Long) As Long
Private Declare Function GetWindowText Lib "user32" Alias "GetWindowTextA" (ByVal hwnd As Long, ByVal lpString As String, ByVal cch As Long) As Long
Private Declare Function GetWindowRect Lib "user32" (ByVal hwnd As Long, lpRect As RECT) As Long

Private Type RECT
  Left As Long
  Top As Long
  Right As Long
  Bottom As Long
End Type

'自定义数据类型
Public Type mType
  fhwnd As Long       '窗口句柄
  fText As String * 255   '窗口标题
  fRect As RECT       '窗口矩形
  pHwnd As Long       '父窗句柄
  pText As String * 255   '父窗标题
End Type

'获取控件信息,写成SUB了,其实用FUNCTION返回值也可以,只是函数里面定义就多了,总的来看需要2个mType数组,这样做只需要一个,占用空间小了
Public Sub mGetAllWindow(m_Type() As mType)

  Dim Wndback As Long       '上一个被查找的目标句柄
  Dim i As Long           '数组控制

  Do
    ReDim Preserve m_Type(i)
    DoEvents
    '获取hwnd,第一个参数指定为0,查找桌面子窗口,第2个参数是开始查找的窗口,第34个参数使函数查找所有窗口
    m_Type(i).fhwnd = FindWindowEx(0, Wndback, vbNullString, vbNullString)
     
    If m_Type(i).fhwnd = 0 Then   '=0时已经查找一遍了,退出
        Exit Sub
    Else                   '否则获取控件相关消息
        '获取标题
        GetWindowText m_Type(i).fhwnd, m_Type(i).fText, 255
        '获取RECT
        GetWindowRect m_Type(i).fhwnd, m_Type(i).fRect
        '获取父HWND
        m_Type(i).pHwnd = GetParent(m_Type(i).fhwnd)
        '获取父标题
        GetWindowText m_Type(i).pHwnd, m_Type(i).pText, 255
    End If
    Wndback = m_Type(i).fhwnd     '保存上一个查的句柄
    i = i + 1
  Loop
End Sub

以下在窗体:(添加一个LISTVIEW1,一个COMMAND1)



Private Sub Command1_Click()

  Dim cType() As mType
  mGetAllWindow cType()
   
  Dim i As Long
   
  ListView1.ListItems.Clear
   
  For i = LBound(cType) To UBound(cType)
    ListView1.ListItems.Add , "a" & i, cType(i).fhwnd
    ListView1.ListItems("a" & i).SubItems(1) = cType(i).fText
    ListView1.ListItems("a" & i).SubItems(2) = cType(i).fRect.Left
    ListView1.ListItems("a" & i).SubItems(3) = cType(i).fRect.Bottom
    ListView1.ListItems("a" & i).SubItems(4) = cType(i).fRect.Top
    ListView1.ListItems("a" & i).SubItems(5) = cType(i).fRect.Right
    ListView1.ListItems("a" & i).SubItems(6) = cType(i).pHwnd
    ListView1.ListItems("a" & i).SubItems(7) = cType(i).pText
  Next

End Sub

Private Sub Form_Load()

  ListView1.ColumnHeaders.Add , , "句柄", 1200
  ListView1.ColumnHeaders.Add , , "标题", 2800
  ListView1.ColumnHeaders.Add , , "Rect.Left", 800
  ListView1.ColumnHeaders.Add , , "Rect.Bottom", 800
  ListView1.ColumnHeaders.Add , , "Rect.Top", 800
  ListView1.ColumnHeaders.Add , , "Rect.Right", 800
  ListView1.ColumnHeaders.Add , , "父窗句柄", 1200
  ListView1.ColumnHeaders.Add , , "父窗标题", 2800

  ListView1.View = lvwReport
  ListView1.FullRowSelect = True
  Command1.Caption = "刷新"
   
End Sub

[VB]在 XP/2K 任务管理器的进程列表中隐藏当前进程

'-----------------------------------------------------
'模块名称:modHideProcess.bas
'模块功能:在 XP/2K 任务管理器的进程列表中隐藏当前进程
'使用方法:直接调用 HideCurrentProcess()
'-----------------------------------------------------

Option Explicit

Private Const STATUS_INFO_LENGTH_MISMATCH = &HC0000004
Private Const STATUS_ACCESS_DENIED = &HC0000022
Private Const STATUS_INVALID_HandLE = &HC0000008
Private Const ERROR_SUCCESS = 0&
Private Const SECTION_MAP_WRITE = &H2
Private Const SECTION_MAP_READ = &H4
Private Const READ_CONTROL = &H20000
Private Const WRITE_DAC = &H40000
Private Const NO_INHERITANCE = 0
Private Const DACL_SECURITY_INFORMATION = &H4

Private Type IO_STATUS_BLOCK
Status As Long
Information As Long
End Type

Private Type UNICODE_STRING
Length As Integer
MaximumLength As Integer
Buffer As Long
End Type

Private Const OBJ_INHERIT = &H2
Private Const OBJ_PERMANENT = &H10
Private Const OBJ_EXCLUSIVE = &H20
Private Const OBJ_CASE_INSENSITIVE = &H40
Private Const OBJ_OPENIF = &H80
Private Const OBJ_OPENLINK = &H100
Private Const OBJ_KERNEL_HandLE = &H200
Private Const OBJ_VALID_ATTRIBUTES = &H3F2

Private Type OBJECT_ATTRIBUTES
Length As Long
RootDirectory As Long
ObjectName As Long
Attributes As Long
SecurityDeor As Long
SecurityQualityOfService As Long
End Type

Private Type ACL
AclRevision As Byte
Sbz1 As Byte
AclSize As Integer
AceCount As Integer
Sbz2 As Integer
End Type

Private Enum ACCESS_MODE
NOT_USED_ACCESS
GRANT_ACCESS
SET_ACCESS
DENY_ACCESS
REVOKE_ACCESS
SET_AUDIT_SUCCESS
SET_AUDIT_FAILURE
End Enum

Private Enum MULTIPLE_TRUSTEE_OPERATION
NO_MULTIPLE_TRUSTEE
TRUSTEE_IS_IMPERSONATE
End Enum

Private Enum TRUSTEE_FORM
TRUSTEE_IS_SID
TRUSTEE_IS_NAME
End Enum

Private Enum TRUSTEE_TYPE
TRUSTEE_IS_UNKNOWN
TRUSTEE_IS_USER
TRUSTEE_IS_GROUP
End Enum

Private Type TRUSTEE
pMultipleTrustee As Long
MultipleTrusteeOperation As MULTIPLE_TRUSTEE_OPERATION
TrusteeForm As TRUSTEE_FORM
TrusteeType As TRUSTEE_TYPE
ptstrName As String
End Type

Private Type EXPLICIT_ACCESS
grfAccessPermissions As Long
grfAccessMode As ACCESS_MODE
grfInheritance As Long
TRUSTEE As TRUSTEE
End Type

Private Type AceArray
List() As EXPLICIT_ACCESS
End Type

Private Enum SE_OBJECT_TYPE
SE_UNKNOWN_OBJECT_TYPE = 0
SE_FILE_OBJECT
SE_SERVICE
SE_PRINTER
SE_REGISTRY_KEY
SE_LMSHARE
SE_KERNEL_OBJECT
SE_WINDOW_OBJECT
SE_DS_OBJECT
SE_DS_OBJECT_ALL
SE_PROVIDER_DEFINED_OBJECT
SE_WMIGUID_OBJECT
End Enum

Private Declare Function SetSecurityInfo Lib "advapi32.dll" (ByVal Handle As Long, ByVal ObjectType As SE_OBJECT_TYPE, ByVal SecurityInfo As Long, ppsidOwner As Long, ppsidGroup As Long, ppDacl As Any, ppSacl As Any) As Long
Private Declare Function GetSecurityInfo Lib "advapi32.dll" (ByVal Handle As Long, ByVal ObjectType As SE_OBJECT_TYPE, ByVal SecurityInfo As Long, ppsidOwner As Long, ppsidGroup As Long, ppDacl As Any, ppSacl As Any, ppSecurityDeor As Long) As Long

Private Declare Function SetEntriesInAcl Lib "advapi32.dll" Alias "SetEntriesInAclA" (ByVal cCountOfExplicitEntries As Long, pListOfExplicitEntries As EXPLICIT_ACCESS, ByVal OldAcl As Long, NewAcl As Long) As Long
Private Declare Sub BuildExplicitAccessWithName Lib "advapi32.dll" Alias "BuildExplicitAccessWithNameA" (pExplicitAccess As EXPLICIT_ACCESS, ByVal pTrusteeName As String, ByVal AccessPermissions As Long, ByVal AccessMode As ACCESS_MODE, ByVal Inheritance As Long)

Private Declare Sub RtlInitUnicodeString Lib "NTDLL.DLL" (DestinationString As UNICODE_STRING, ByVal SourceString As Long)
Private Declare Function ZwOpenSection Lib "NTDLL.DLL" (SectionHandle As Long, ByVal DesiredAccess As Long, ObjectAttributes As Any) As Long
Private Declare Function LocalFree Lib "kernel32" (ByVal hMem As Any) As Long
Private Declare Function CloseHandle Lib "kernel32" (ByVal hObject As Long) As Long
Private Declare Function MapViewOfFile Lib "kernel32" (ByVal hFileMappingObject As Long, ByVal dwDesiredAccess As Long, ByVal dwFileOffsetHigh As Long, ByVal dwFileOffsetLow As Long, ByVal dwNumberOfBytesToMap As Long) As Long
Private Declare Function UnmapViewOfFile Lib "kernel32" (lpBaseAddress As Any) As Long
Private Declare Sub CopyMemory Lib "kernel32" Alias "RtlMoveMemory" (Destination As Any, Source As Any, ByVal Length As Long)
Private Declare Function GetVersionEx Lib "kernel32" Alias "GetVersionExA" (LpVersionInformation As OSVERSIONINFO) As Long
Private Type OSVERSIONINFO
dwOSVersionInfoSize As Long
dwMajorVersion As Long
dwMinorVersion As Long
dwBuildNumber As Long
dwPlatformId As Long
szCSDVersion As String * 128
End Type

Private verinfo As OSVERSIONINFO

Private g_hNtDLL As Long
Private g_pMapPhysicalMemory As Long
Private g_hMPM As Long
Private aByte(3) As Byte

Public Sub HideCurrentProcess()
'在进程列表中隐藏当前应用程序进程

Dim thread As Long, process As Long, fw As Long, bw As Long
Dim lOffsetFlink As Long, lOffsetBlink As Long, lOffsetPID As Long

verinfo.dwOSVersionInfoSize = Len(verinfo)
If (GetVersionEx(verinfo)) <> 0 Then
If verinfo.dwPlatformId = 2 Then
If verinfo.dwMajorVersion = 5 Then
Select Case verinfo.dwMinorVersion
Case 0
lOffsetFlink = &HA0
lOffsetBlink = &HA4
lOffsetPID = &H9C
Case 1
lOffsetFlink = &H88
lOffsetBlink = &H8C
lOffsetPID = &H84
End Select
End If
End If
End If

If OpenPhysicalMemory <> 0 Then
thread = GetData(&HFFDFF124)
process = GetData(thread + &H44)
fw = GetData(process + lOffsetFlink)
bw = GetData(process + lOffsetBlink)
SetData fw + 4, bw
SetData bw, fw
CloseHandle g_hMPM
End If
End Sub

Private Sub SetPhyscialMemorySectionCanBeWrited(ByVal hSection As Long)
Dim pDacl As Long
Dim pNewDacl As Long
Dim pSD As Long
Dim dwRes As Long
Dim ea As EXPLICIT_ACCESS

GetSecurityInfo hSection, SE_KERNEL_OBJECT, DACL_SECURITY_INFORMATION, 0, 0, pDacl, 0, pSD

ea.grfAccessPermissions = SECTION_MAP_WRITE
ea.grfAccessMode = GRANT_ACCESS
ea.grfInheritance = NO_INHERITANCE
ea.TRUSTEE.TrusteeForm = TRUSTEE_IS_NAME
ea.TRUSTEE.TrusteeType = TRUSTEE_IS_USER
ea.TRUSTEE.ptstrName = "CURRENT_USER" & vbNullChar

SetEntriesInAcl 1, ea, pDacl, pNewDacl

SetSecurityInfo hSection, SE_KERNEL_OBJECT, DACL_SECURITY_INFORMATION, 0, 0, ByVal pNewDacl, 0

CleanUp:
LocalFree pSD
LocalFree pNewDacl
End Sub

Private Function OpenPhysicalMemory() As Long
Dim Status As Long
Dim PhysmemString As UNICODE_STRING
Dim Attributes As OBJECT_ATTRIBUTES

RtlInitUnicodeString PhysmemString, StrPtr("\Device\PhysicalMemory")
Attributes.Length = Len(Attributes)
Attributes.RootDirectory = 0
Attributes.ObjectName = VarPtr(PhysmemString)
Attributes.Attributes = 0
Attributes.SecurityDeor = 0
Attributes.SecurityQualityOfService = 0

Status = ZwOpenSection(g_hMPM, SECTION_MAP_READ or SECTION_MAP_WRITE, Attributes)
If Status = STATUS_ACCESS_DENIED Then
Status = ZwOpenSection(g_hMPM, READ_CONTROL or WRITE_DAC, Attributes)
SetPhyscialMemorySectionCanBeWrited g_hMPM
CloseHandle g_hMPM
Status = ZwOpenSection(g_hMPM, SECTION_MAP_READ or SECTION_MAP_WRITE, Attributes)
End If

Dim lDirectoty As Long
verinfo.dwOSVersionInfoSize = Len(verinfo)
If (GetVersionEx(verinfo)) <> 0 Then
If verinfo.dwPlatformId = 2 Then
If verinfo.dwMajorVersion = 5 Then
Select Case verinfo.dwMinorVersion
Case 0
lDirectoty = &H30000
Case 1
lDirectoty = &H39000
End Select
End If
End If
End If

If Status = 0 Then
g_pMapPhysicalMemory = MapViewOfFile(g_hMPM, 4, 0, lDirectoty, &H1000)
If g_pMapPhysicalMemory <> 0 Then OpenPhysicalMemory = g_hMPM
End If
End Function

Private Function LinearToPhys(BaseAddress As Long, addr As Long) As Long
Dim VAddr As Long, PGDE As Long, PTE As Long, PAddr As Long
Dim lTemp As Long

VAddr = addr
CopyMemory aByte(0), VAddr, 4
lTemp = Fix(ByteArrToLong(aByte) / (2 ^ 22))

PGDE = BaseAddress + lTemp * 4
CopyMemory PGDE, ByVal PGDE, 4

If (PGDE And 1) <> 0 Then
lTemp = PGDE And &H80
If lTemp <> 0 Then
PAddr = (PGDE And &HFFC00000) + (VAddr And &H3FFFFF)
Else
PGDE = MapViewOfFile(g_hMPM, 4, 0, PGDE And &HFFFFF000, &H1000)
lTemp = (VAddr And &H3FF000) / (2 ^ 12)
PTE = PGDE + lTemp * 4
CopyMemory PTE, ByVal PTE, 4

If (PTE And 1) <> 0 Then
PAddr = (PTE And &HFFFFF000) + (VAddr And &HFFF)
UnmapViewOfFile PGDE
End If
End If
End If

LinearToPhys = PAddr
End Function

Private Function GetData(addr As Long) As Long
Dim phys As Long, tmp As Long, ret As Long

phys = LinearToPhys(g_pMapPhysicalMemory, addr)
tmp = MapViewOfFile(g_hMPM, 4, 0, phys And &HFFFFF000, &H1000)
If tmp <> 0 Then
ret = tmp + ((phys And &HFFF) / (2 ^ 2)) * 4
CopyMemory ret, ByVal ret, 4

UnmapViewOfFile tmp
GetData = ret
End If
End Function

Private Function SetData(ByVal addr As Long, ByVal data As Long) As Boolean
Dim phys As Long, tmp As Long, x As Long

phys = LinearToPhys(g_pMapPhysicalMemory, addr)
tmp = MapViewOfFile(g_hMPM, SECTION_MAP_WRITE, 0, phys And &HFFFFF000, &H1000)
If tmp <> 0 Then
x = tmp + ((phys And &HFFF) / (2 ^ 2)) * 4
CopyMemory ByVal x, data, 4

UnmapViewOfFile tmp
SetData = True
End If
End Function

Private Function ByteArrToLong(inByte() As Byte) As Double
Dim I As Integer
For I = 0 To 3
ByteArrToLong = ByteArrToLong + inByte(I) * (&H100 ^ I)
Next I
End Function

[VB]增加应用程序的系统托盘图标

1、新建立一个VB6工程,将Form1的ShowInTaskBar属性设置为False  
2、菜单:工程--添加模块 按“打开”这样就添加了一个新模块,名为Module1,保存为Module1.bas  
3、在Module1中写下如下代码:  

Option Explicit  

Public Const MAX_TOOLTIP As Integer = 64  
Public Const NIF_ICON = &H2  
Public Const NIF_MESSAGE = &H1  
Public Const NIF_TIP = &H4  
Public Const NIM_ADD = &H0  
Public Const NIM_Delete = &H2  
Public Const WM_MOUSEMOVE = &H200  
Public Const WM_LBUTTONDOWN = &H201  
Public Const WM_LBUTTONUP = &H202  
Public Const WM_LBUTTONDBLCLK = &H203  
Public Const WM_RBUTTONDOWN = &H204  
Public Const WM_RBUTTONUP = &H205  
Public Const WM_RBUTTONDBLCLK = &H206  

Public Const SW_RESTORE = 9  
Public Const SW_HIDE = 0  

Public nfIconData As NOTIFYICONDATA  


Public Type NOTIFYICONDATA  
cbSize As Long  
hWnd As Long  
uID As Long  
uFlags As Long  
uCallbackMessage As Long  
hIcon As Long  
szTip As String * MAX_TOOLTIP  
End Type  

Public Declare Function ShowWindow Lib "user32" (ByVal hWnd As Long, ByVal nCmdShow As Long) As Long  
Public Declare Function Shell_NotifyIcon Lib "shell32.dll" Alias "Shell_NotifyIconA" (ByVal dwMessage As Long, lpData As NOTIFYICONDATA) As Long  
4、在Form1的Load事件中写下如下代码:  

Private Sub Form_Load()  

'以下把程序放入System Tray====================================System Tray Begin  
With nfIconData  
.hWnd = Me.hWnd  
.uID = Me.Icon  
.uFlags = NIF_ICON or NIF_MESSAGE or NIF_TIP  
.uCallbackMessage = WM_MOUSEMOVE  
.hIcon = Me.Icon.Handle  
'定义鼠标移动到托盘上时显示的Tip  
.szTip = App.Title + "(版本 " & App.Major & "." & App.Minor & "." & App.Revision & ")" & vbNullChar  
.cbSize = Len(nfIconData)  
End With  
Call Shell_NotifyIcon(NIM_ADD, nfIconData)  
'=============================================================System Tray End  
Me.Hide  
End Sub  
5、在Form1的QueryUnload事件中写入如下代码:  

Private Sub Form_QueryUnload(Cancel As Integer, UnloadMode As Integer)  
Call Shell_NotifyIcon(NIM_Delete, nfIconData)  
End Sub  
6、在Form1的MouseMove事件中写下如下代码:  
Private Sub Form_MouseMove(Button As Integer, Shift As Integer, X As Single, Y As Single)  
Dim lMsg As Single  
lMsg = X / Screen.TwipsPerPixelX  
Select Case lMsg  
Case WM_LBUTTONUP  
'MsgBox "请用鼠标右键点击图标!", vbInformation, "实时播音专家"  
'单击左键,显示窗体  
ShowWindow Me.hWnd, SW_RESTORE  
'下面两句的目的是把窗口显示在窗口最顶层  
'Me.Show  
'Me.SetFocus  
'' Case WM_RBUTTONUP  
'' PopupMenu MenuTray '如果是在系统Tray图标上点右键,则弹出菜单MenuTray  
'' Case WM_MOUSEMOVE  
'' Case WM_LBUTTONDOWN  
'' Case WM_LBUTTONDBLCLK  
'' Case WM_RBUTTONDOWN  
'' Case WM_RBUTTONDBLCLK  
'' Case Else  
End Select  
End Sub  
7、现在将程序保存起来运行看看系统托盘处是否增加了一个本工程的图标。单击此图标,Form1就自动弹出来了。

[VB]实现程序窗口置顶的例子

同样在FORM1中加一个CHECK控件

然后下面代码放入代码区:
Public Sub SetFormOnTop(myForm As Object, mTruth As Boolean)
  If mTruth = True Then
    SetWindowPos myForm.hwnd, HWND_TOPMOST, 0, 0, 0, 0, SWP_NOMOVE or SWP_NOSIZE
  Else
    SetWindowPos myForm.hwnd, HWND_NOTOPMOST, 0, 0, 0, 0, SWP_NOMOVE or SWP_NOSIZE
  End If
End Sub  

Private Sub Check2_Click()
Dim b As Boolean
  b = Check2.Value
  SetFormOnTop Form1, b
End Sub

再把下面代码放入模块区:

'======================================

Public Declare Function GetForegroundWindow Lib "user32" () As Long
Public Declare Function SetForegroundWindow Lib "user32" (ByVal hwnd As Long) As Long
Public Declare Function GetWindowLong Lib "user32" Alias "GetWindowLongA" (ByVal hwnd As Long, ByVal nIndex As Long) As Long
Public Declare Function SetWindowLong Lib "user32" Alias "SetWindowLongA" (ByVal hwnd As Long, ByVal nIndex As Long, ByVal dwNewLong As Long) As Long
Public Declare Function SetWindowPos Lib "user32" (ByVal hwnd As Long, ByVal hWndInsertAfter As Long, ByVal X As Long, ByVal Y As Long, ByVal cx As Long, ByVal cy As Long, ByVal wFlags As Long) As Long
Public Const HWND_TOPMOST = -1
Public Const HWND_NOTOPMOST = -2
Public Const SWP_NOSIZE = &H1
Public Const SWP_NOMOVE = &H2

'==================

[VB]隐藏指定窗口

首先在FORM1里放一个CHECK控件
然后代码区放:
'------------------------------
Private Declare Function FindWindow Lib "user32" Alias "FindWindowA" (ByVal lpClassName As String, ByVal lpWindowName As String) As Long
Private Declare Function GetWindowThreadProcessId Lib "user32" (ByVal hwnd As Long, lpdwProcessId As Long) As Long

Private Sub Check1_Click()
Dim hwnd As Long ' 储存 FindWindow 函数返回的句柄
hwnd = FindWindow(vbNullString, "Macromedia Flash Player 8")
If hwnd = 0 Then
Else
If Check1.Value = 1 Then
    ShowWindow hwnd, SW_HIDE
  Else
    ShowWindow hwnd, SW_SHOW
  End If
End If
End Sub
'-----------------------------
模块区放:
'-----------------------------
Public Declare Function ShowWindow Lib "user32" (ByVal hwnd As Long, ByVal nCmdShow As Long) As Long
Public Const SW_HIDE = 0
Public Const SW_SHOW = 5
'-----------------------------
测试下哈

该用户从未签到

发表于 2011-4-7 07:32:00 | 显示全部楼层
居然又多了这么多功能,谢谢~~

该用户从未签到

发表于 2011-4-7 07:32:06 | 显示全部楼层
这些挺好,可以做成函数以便调用

该用户从未签到

发表于 2011-4-7 07:32:14 | 显示全部楼层
想问问,有什么方法能找出隐藏进程,但有窗口的进程ID?例子就不列举了,现时流行一个热门GAME就如此。
  • TA的每日心情
    开心
    2021-6-26 21:38
  • 发表于 2013-10-17 20:51:32 | 显示全部楼层
    看过,做成模块调用

    该用户从未签到

    发表于 2013-11-15 13:16:22 | 显示全部楼层
    看看 学习学习!!

    该用户从未签到

    发表于 2013-11-22 15:59:23 | 显示全部楼层
    很好 不错
    点击按钮快速添加回复内容: 支持 高兴 激动 给力 加油 苦寻 生气 回帖 路过 感恩
    您需要登录后才可以回帖 登录 | 注册账号

    本版积分规则

    小黑屋|手机版|Archiver|看流星社区 |网站地图

    GMT+8, 2024-3-29 23:37

    Powered by Kanliuxing X3.4

    © 2010-2019 kanliuxing.com

    快速回复 返回顶部 返回列表