VB用API实现各种对话框(总结)

各种对话框(总结)
  
'
'标准对话框(SmDialog)
'
Option Explicit
''定义一个全局变量,用于保存字体的各种属性
Public Type SmFontAttr
  FontName As String       '字体名
  FontSize As Integer      '字体大小
  FontBod As Boolean       '是否黑体
  FontItalic As Boolean    '是否斜体
  FontUnderLine As Boolean '是否下划线
  FontStrikeou As Boolean
  FontColor As Long
  WinHwnd As Long
End Type
Dim M_GetFont As SmFontAttr
''**系统常量------------------------------------------
Private Const SWP_NOOWNERZORDER = &H200
Private Const SWP_HIDEWINDOW = &H80
Private Const SWP_NOACTIVATE = &H10
Private Const SWP_NOMOVE = &H2
Private Const SWP_NOREDRAW = &H8
Private Const SWP_NOREPOSITION = SWP_NOOWNERZORDER
Private Const SWP_NOSIZE = &H1
Private Const SWP_NOZORDER = &H4
Private Const SWP_SHOWWINDOW = &H40
Private Const RESOURCETYPE_DISK = &H1  '网络驱动器
Private Const RESOURCETYPE_PRINT = &H2 '网络打印机
'/------------------------------------------------------------
Private Const NoError = 0
Private Const CSIDL_DESKTOP = &H0
Private Const CSIDL_PROGRAMS = &H2
Private Const CSIDL_CONTROLS = &H3
Private Const CSIDL_PRINTERS = &H4
Private Const CSIDL_PERSONAL = &H5
Private Const CSIDL_FAVORITES = &H6
Private Const CSIDL_STARTUP = &H7
Private Const CSIDL_RECENT = &H8
Private Const CSIDL_SENDTO = &H9
Private Const CSIDL_BITBUCKET = &HA
Private Const CSIDL_STARTMENU = &HB
Private Const CSIDL_DESKTOPDIRECTORY = &H10
Private Const CSIDL_DRIVES = &H11
Private Const CSIDL_NETWORK = &H12
Private Const CSIDL_NETHOOD = &H13
Private Const CSIDL_FONTS = &H14
Private Const CSIDL_TEMPLATES = &H15
Private Const LF_FACESIZE = 32
Private Const MAX_PATH = 260
Private Const CF_INITTOLOGFONTSTRUCT = &H40&
Private Const CF_FIXEDPITCHONLY = &H4000&
Private Const CF_EFFECTS = &H100&
Private Const ITALIC_FONTTYPE = &H200
Private Const BOLD_FONTTYPE = &H100
Private Const CF_NOFACESEL = &H80000
Private Const CF_NOSCRIPTSEL = &H800000
Private Const CF_PRINTERFONTS = &H2
Private Const CF_SCALABLEONLY = &H20000
Private Const CF_SCREENFONTS = &H1
Private Const CF_SHOWHELP = &H4&
Private Const CF_BOTH = (CF_SCREENFONTS Or CF_PRINTERFONTS)
'/------------------------------------------
Private Type CHOOSECOLOR
        lStructSize As Long
        hwndOwner As Long
        hInstance As Long
        rgbResult As Long
        lpCustColors As String
        flags As Long
        lCustData As Long
        lpfnHook As Long
        lpTemplateName As String
End Type
Private Type OPENFILENAME
        lStructSize As Long
        hwndOwner As Long
        hInstance As Long
        lpstrFilter As String
        lpstrCustomFilter As String
        nMaxCustFilter As Long
        nFilterIndex As Long
        lpstrFile As String
        nMaxFile As Long
        lpstrFileTitle As String
        nMaxFileTitle As Long
        lpstrInitialDir As String
        lpstrTitle As String
        flags As Long
        nFileOffset As Integer
        nFileExtension As Integer
        lpstrDefExt As String
        lCustData As Long
        lpfnHook As Long
        lpTemplateName As String
End Type
'/-----------------------------------------------------------
Private Type LOGFONT
        lfHeight As Long
        lfWidth As Long
        lfEscapement As Long
        lfOrientation As Long
        lfWeight As Long
        lfItalic As Byte
        lfUnderline As Byte
        lfStrikeOut As Byte
        lfCharSet As Byte
        lfOutPrecision As Byte
        lfClipPrecision As Byte
        lfQuality As Byte
        lfPitchAndFamily As Byte
        lfFaceName As String * LF_FACESIZE
End Type
Private Type CHOOSEFONT
        lStructSize As Long
        hwndOwner As Long
        hdc As Long
        lpLogFont As Long
        iPointSize As Long
        flags As Long
        rgbColors As Long
        lCustData As Long
        lpfnHook As Long
        lpTemplateName As String
        hInstance As Long
        lpszStyle As String
        nFontType As Integer
        MISSING_ALIGNMENT As Integer
        nSizeMin As Long
        nSizeMax As Long
 End Type
'/--------------
Private Type SHITEMID
    cb As Long
    abID() As Byte
End Type
Private Type ITEMIDLIST
     mkid As SHITEMID
End Type
'/------------------------------------------
Private Declare Function SHGetPathFromIDList Lib "shell32.dll" Alias

"SHGetPathFromIDListA" _
                              (ByVal Pidl As Long, ByVal pszPath As String) As Long
Private Declare Function SHGetSpecialFolderLocation Lib "shell32.dll" _
                              (ByVal hwndOwner As Long, ByVal nFolder As Long, _
                               Pidl As ITEMIDLIST) As Long
'/------------------------------------------
Private Declare Function GetSaveFileName Lib "comdlg32.dll" Alias "GetSaveFileNameA"

(pOpenfilename As OPENFILENAME) As Long
Private Declare Function GetOpenFileName Lib "comdlg32.dll" Alias "GetOpenFileNameA"

(pOpenfilename As OPENFILENAME) As Long
Private Declare Function CHOOSECOLOR Lib "comdlg32.dll" Alias "ChooseColorA"

(pChoosecolor As CHOOSECOLOR) As Long
Private Declare Function WNetConnectionDialog Lib "mpr.dll" (ByVal hWnd As Long,

ByVal dwType As Long) As Long
Private Declare Function CHOOSEFONT Lib "comdlg32.dll" Alias "ChooseFontA"

(pChooseFont As CHOOSEFONT) As Long
'/=======显示断开网络资源对话框============
Private Declare Function WNetDisconnectDialog Lib "mpr.dll" _
      (ByVal hWnd As Long, ByVal dwType As Long) As Long
'/================================================================================
Private Declare Sub CoTaskMemFree Lib "ole32.dll" (ByVal pv As Long)
Private Declare Function SHBrowseForFolder Lib "shell32.dll" Alias

"SHBrowseForFolderA" _
                                               (lpBrowseInfo As BROWSEINFO) As Long
Private Type BROWSEINFO
    hOwner As Long
    pidlRoot As Long
    pszDisplayName As String
    lpszTitle As String
    ulFlags As Long
    lpfn As Long
    lParam As Long
    iImage As Long
End Type
'/结构说明: _
          hOwner 调用这个对话框的窗口的句柄 _
          pidlRoot 指向你希望浏览的最上面的文件夹的符列表 _
          pszDisplayName 用于保存用户所选择的文件夹的显示名的缓冲区 _
          lpszTitle 浏览对话框的标题 _
          ulFlags  决定浏览什么的标志(见下) _
          lpfn  当事件发生时对话框调用的回调函数的地址.可将它设定为NULL _
          lparam 若定义了回调函数,则为传递给回调函数的值 _
          iImage As Long  保存所选文件夹映像索引的缓冲区 _
ulFlags参数(见下:)
Private Const BIF_RETURNONLYFSDIRS = &H1     '仅允许浏览文件系统文件夹
Private Const BIF_DONTGOBELOWDOMAIN = &H2    '利用这个值强制用户仪在网上邻居的域级别


Private Const BIF_STATUSTEXT = &H4           '在选择对话中显示状态栏
Private Const BIF_RETURNFSANCESTORS = &H8    '返回文件系统祖先
Private Const BIF_BROWSEFORCOMPUTER = &H1000 '允许浏览计算机
Private Const BIF_BROWSEFORPRINTER = &H2000  '允许游览打印机文件夹
'/--------------------------------------------------------------------------------
Dim FontInfo As SmFontAttr       '字体
'/--------------------------------------------------------------------------------

Private Function GetFolderValue(wIdx As Integer) As Long
    If wIdx < 2 Then
      GetFolderValue = 0
    ElseIf wIdx < 12 Then
      GetFolderValue = wIdx
    Else
      GetFolderValue = wIdx + 4
    End If
End Function
'
Private Function GetReturnType() As Long
  Dim dwRtn As Long
  dwRtn = dwRtn Or BIF_RETURNONLYFSDIRS
  GetReturnType = dwRtn
End Function
'
'文件夹选择对话框
'函数:SaveFile
'参数:Title    设置对话框的标签.
'     hWnd     调用此函数的HWND
'     FolderID SmBrowFolder枚举(默认:我的电脑).
'返回值:String 文件夹路径.
'例子:
Public Function GetFolder(Optional Title As String, _
                          Optional hWnd As Long, _
                          Optional FolderID As SmBrowFolder = MyComputer) As String
  Dim Bi As BROWSEINFO
  Dim Pidl As Long
  Dim Folder As String
  Dim IDL As ITEMIDLIST
  Dim nFolder As Long
  Dim ReturnFol As String
  Dim Fid As Integer
 
  Fid = FolderID
  Folder = String$(255, Chr$(0))
  With Bi
       .hOwner = hWnd
       nFolder = GetFolderValue(Fid)
       If SHGetSpecialFolderLocation(ByVal hWnd, ByVal nFolder, IDL) = NoError Then
          .pidlRoot = IDL.mkid.cb
       End If
       .pszDisplayName = String$(MAX_PATH, Fid)
   
       If Len(Title) > 0 Then
         .lpszTitle = Title & Chr$(0)
       Else
         .lpszTitle = "请选择文件夹:" & Chr$(0)
       End If
  
      .ulFlags = GetReturnType()
  End With
 
  Pidl = SHBrowseForFolder(Bi)
  '/返回所选的文件夹路径
  If SHGetPathFromIDList(ByVal Pidl, ByVal Folder) Then
     ReturnFol = Left$(Folder, InStr(Folder, Chr$(0)) - 1)
     If Right$(Trim$(ReturnFol), 1) <> "/" Then ReturnFol = ReturnFol & "/"
     GetFolder = ReturnFol
  Else
    GetFolder = ""
  End If
End Function
'
'文件保存对话框
'函数:SaveFile
'参数:WinHwnd   调用此函数的HWND
'     BoxLabel  设置对话框的标签.
'     StartPath 设置初始化路径.
'     FilterStr 文件过滤.
'     Flag      标志.(参考MSDN)
'返回值:String 文件名.
'例子:
Public Function SaveFile(WinHwnd As Long, _
                         Optional BoxLabel As String = "", _
                         Optional StartPath As String = "", _
                         Optional FilterStr = "*.*|*.*", _
                         Optional Flag As Variant = &H4 Or &H200000) As String
  Dim Rc As Long
  Dim pOpenfilename As OPENFILENAME
  Dim Fstr1() As String
  Dim Fstr As String
  Dim I As Long
  Const MAX_Buffer_LENGTH = 256
 
  On Error Resume Next
 
  If Len(Trim$(StartPath)) > 0 Then
     If Right$(StartPath, 1) <> "/" Then StartPath = StartPath & "/"
     If Dir$(StartPath, vbDirectory + vbHidden) = "" Then
        StartPath = App.Path
     End If
  Else
     StartPath = App.Path
  End If
  If Len(Trim$(FilterStr)) = 0 Then
     Fstr = "*.*|*.*"
  End If
  Fstr1 = Split(FilterStr, "|")
  For I = 0 To UBound(Fstr1)
      Fstr = Fstr & Fstr1(I) & vbNullChar
  Next
  '/--------------------------------------------------
  With pOpenfilename
       .hwndOwner = WinHwnd
       .hInstance = App.hInstance
       .lpstrTitle = BoxLabel
       .lpstrInitialDir = StartPath
       .lpstrFilter = Fstr
       .nFilterIndex = 1
       .lpstrDefExt = vbNullChar & vbNullChar
       .lpstrFile = String(MAX_Buffer_LENGTH, 0)
       .nMaxFile = MAX_Buffer_LENGTH - 1
       .lpstrFileTitle = .lpstrFile
       .nMaxFileTitle = MAX_Buffer_LENGTH
       .lStructSize = Len(pOpenfilename)
       .flags = Flag
  End With
  Rc = GetSaveFileName(pOpenfilename)
  If Rc Then
     SaveFile = Left$(pOpenfilename.lpstrFile, pOpenfilename.nMaxFile)
  Else
    SaveFile = ""
  End If
End Function

'
'文件打开对话框
'函数:OpenFile
'参数:WinHwnd   调用此函数的HWND
'     BoxLabel  设置对话框的标签.
'     StartPath 设置初始化路径.
'     FilterStr 文件过滤.
'     Flag      标志.(参考MSDN)
'返回值:String 文件名.
'例子:
Public Function OpenFile(WinHwnd As Long, _
                         Optional BoxLabel As String = "", _
                         Optional StartPath As String = "", _
                         Optional FilterStr = "*.*|*.*", _
                         Optional Flag As Variant = &H8 Or &H200000) As String
  Dim Rc As Long
  Dim pOpenfilename As OPENFILENAME
  Dim Fstr1() As String
  Dim Fstr As String
  Dim I As Long
  Const MAX_Buffer_LENGTH = 256
 
  On Error Resume Next
 
  If Len(Trim$(StartPath)) > 0 Then
     If Right$(StartPath, 1) <> "/" Then StartPath = StartPath & "/"
     If Dir$(StartPath, vbDirectory + vbHidden) = "" Then
        StartPath = App.Path
     End If
  Else
     StartPath = App.Path
  End If
  If Len(Trim$(FilterStr)) = 0 Then
     Fstr = "*.*|*.*"
  End If
  Fstr = ""
  Fstr1 = Split(FilterStr, "|")
  For I = 0 To UBound(Fstr1)
      Fstr = Fstr & Fstr1(I) & vbNullChar
  Next
  With pOpenfilename
       .hwndOwner = WinHwnd
       .hInstance = App.hInstance
       .lpstrTitle = BoxLabel
       .lpstrInitialDir = StartPath
       .lpstrFilter = Fstr
       .nFilterIndex = 1
       .lpstrDefExt = vbNullChar & vbNullChar
       .lpstrFile = String(MAX_Buffer_LENGTH, 0)
       .nMaxFile = MAX_Buffer_LENGTH - 1
       .lpstrFileTitle = .lpstrFile
       .nMaxFileTitle = MAX_Buffer_LENGTH
       .lStructSize = Len(pOpenfilename)
       .flags = Flag
  End With
  Rc = GetOpenFileName(pOpenfilename)
  If Rc Then
     OpenFile = Left$(pOpenfilename.lpstrFile, pOpenfilename.nMaxFile)
  Else
     OpenFile = ""
  End If
End Function
'
'颜色对话框
'函数:GetColor
'参数:
'返回值:Long,用户所选择的颜色.
'例子:
Public Function GetColor() As Long
  Dim Rc As Long
  Dim pChoosecolor As CHOOSECOLOR
  Dim CustomColor() As Byte
  With pChoosecolor
       .hwndOwner = 0
       .hInstance = App.hInstance
       .lpCustColors = StrConv(CustomColor, vbUnicode)
       .flags = 0
       .lStructSize = Len(pChoosecolor)
  End With
  Rc = CHOOSECOLOR(pChoosecolor)
  If Rc Then
        GetColor = pChoosecolor.rgbResult
  Else
        GetColor = -1
  End If
End Function
'
'显示映射网络驱动器对话框
'函数:ConnectDisk
'参数:hWnd 调用此函数的窗口HWND.(ME.HWN)
'返回值:=0,成功,<>0,失败.
'例子:
Public Function ConnectDisk(Optional hWnd As Long) As Long
  Dim Rc As Long
  If IsNumeric(hWnd) Then
     Rc = WNetConnectionDialog(hWnd, RESOURCETYPE_DISK)
  Else
     Rc = WNetConnectionDialog(0, RESOURCETYPE_DISK)
  End If
  ConnectDisk = Rc
End Function
'
'显示映射网络打印机对话框
'函数:ConnectPrint
'参数:hWnd 调用此函数的窗口HWND.(ME.HWN)
'返回值:=0,成功,<>0,失败.
'例子:
Public Function ConnectPrint(Optional hWnd As Long) As Long
  Dim Rc As Long
  If IsNumeric(hWnd) Then
     Rc = WNetConnectionDialog(hWnd, RESOURCETYPE_PRINT)
  Else
     Rc = WNetConnectionDialog(0, RESOURCETYPE_PRINT)
  End If
End Function
'
'断开映射网络驱动器对话框
'函数:DisconnectDisk
'参数:hWnd 调用此函数的窗口HWND.(ME.HWN)
'返回值:=0,成功,<>0,失败.
'例子:
Public Function DisconnectDisk(Optional hWnd As Long) As Long
  Dim Rc As Long
  If IsNumeric(hWnd) Then
     Rc = WNetDisconnectDialog(hWnd, RESOURCETYPE_DISK)
  Else
     Rc = WNetDisconnectDialog(0, RESOURCETYPE_DISK)
  End If
End Function
'
'断开映射网络打印机关话框
'函数:DisconnectPrint
'参数:hWnd 调用此函数的窗口HWND.(ME.HWN)
'返回值:=0,成功,<>0,失败.
'例子:
Public Function DisconnectPrint(Optional hWnd As Long) As Long
  Dim Rc As Long
  If IsNumeric(hWnd) Then
     Rc = WNetDisconnectDialog(hWnd, RESOURCETYPE_PRINT)
  Else
     Rc = WNetDisconnectDialog(0, RESOURCETYPE_PRINT)
  End If
End Function
'
'字体选择对话框
'函数:GetFont
'参数:WinHwnd 调用此函数的窗口HWND.(ME.HWN)
'返回值:SmFontAttr 结构变量.
'例子:
'       Dim mDialog As New SmDialog
'       Dim mFontInfo As SmFontAttr
'       mFontInfo = mDialog.GetFont(Me.hWnd)
'       Set mDialog = Nothing
Public Function GetFont(WinHwnd As Long) As SmFontAttr
        Dim Rc As Long
        Dim pChooseFont As CHOOSEFONT
        Dim pLogFont As LOGFONT
       
        With pLogFont
             .lfFaceName = StrConv(FontInfo.FontName, vbFromUnicode)
             .lfItalic = FontInfo.FontItalic
             .lfUnderline = FontInfo.FontUnderLine
             .lfStrikeOut = FontInfo.FontStrikeou
        End With
        With pChooseFont
             .hInstance = App.hInstance
             If IsNumeric(WinHwnd) Then .hwndOwner = WinHwnd
             .flags = CF_BOTH + CF_INITTOLOGFONTSTRUCT + CF_EFFECTS + CF_NOSCRIPTSEL
             If IsNumeric(FontInfo.FontSize) Then .iPointSize = FontInfo.FontSize *

10
             If FontInfo.FontBod Then .nFontType = .nFontType + BOLD_FONTTYPE
             If IsNumeric(FontInfo.FontColor) Then .rgbColors = FontInfo.FontColor
             .lStructSize = Len(pChooseFont)
             .lpLogFont = VarPtr(pLogFont)
        End With
        Rc = CHOOSEFONT(pChooseFont)
        If Rc Then
           FontInfo.FontName = StrConv(pLogFont.lfFaceName, vbUnicode)
           FontInfo.FontName = Left$(FontInfo.FontName, InStr(FontInfo.FontName,

vbNullChar) - 1)
           With pChooseFont
                FontInfo.FontSize = .iPointSize / 10                    '返回字体大


                FontInfo.FontBod = (.nFontType And BOLD_FONTTYPE)       '返回是/否黑


                FontInfo.FontItalic = (.nFontType And ITALIC_FONTTYPE)  '是/否斜体
                FontInfo.FontUnderLine = (pLogFont.lfUnderline)         '是/否下划线
                FontInfo.FontStrikeou = (pLogFont.lfStrikeOut)
                FontInfo.FontColor = .rgbColors
           End With
        End If
        GetFont = FontInfo
End Function
'
'文件打开.(带预览文件功能)
'函数:BrowFile
'参数:Pattern 文件类型字符串,StarPath 开始路径,IsBrow 是否生成预览
'返回值:[确定] 文件路径.[取消] 空字符串
'例:Me.Caption =

FileBrow.BrowFile("图片文件|*.JPG;*.GIF;*.BMP|媒体文件|*.DAT;*.MPG;*.SWF;*.MP3;*.MP2

")
Public Function BrowFile(Optional Pattern As String = "*,*|*.*", _
                         Optional StarPath As String = "C:/", _
                         Optional IsBrow As Boolean = True) As String
      
       On Error Resume Next
      
       If Len(Trim$(Pattern)) = 0 Then Pattern = "*.*|*.*"
       P_FilePart = Pattern
       P_StarPath = StarPath
       P_IsBrow = IsBrow
       FrmBrowFile.Show 1
       BrowFile = P_FullFileName
End Function
'
'显示网上邻居
'函数:ShowNetWork
'参数:FrmCap 窗口标题,Labction 提示标签名.
'返回值:[确定]  所选计算机名称.[取消] 空字符串.
'例:
Public Function ShowNetWork(Optional FrmCap As String = "网上邻居", _
                            Optional Labction As String = "选择计算机名称.") As

String
       ShowLan.Hide
       ShowLan.Caption = FrmCap
       ShowLan.LabNNCaption = Labction
       ShowLan.Show 1
       ShowNetWork = P_NetReturnVal
End Function

  • 0
    点赞
  • 1
    收藏
    觉得还不错? 一键收藏
  • 0
    评论
├─Example001-悬挂式窗口 ├─Example002-半透明窗口 ├─Example003-椭圆形窗口 ├─Example004-组合圆形窗口 ├─Example005-多边形窗口 ├─Example006-艺术窗口 ├─Example007-字形窗口 ├─Example008-移动没有标题栏的窗口 ├─Example009-窗口背景花纹的实现 ├─Example010-渐变的窗口背景 ├─Example011-让窗口运行在不同的分辨率下 ├─Example012-控件随着窗口大小按比例变化 ├─Example013-在运行中显示或隐藏窗口的标题栏 ├─Example014-制作软件封面 ├─Example015-霓虹灯效果文字 ├─Example016-保存窗口设置 ├─Example017-窗口的动画效果 ├─Example018-显示动画光标 ├─Example019-制作工具栏 ├─Example020-Office或IE风格的工具栏 ├─Example021-通过鼠标拖动停靠工具栏 ├─Example022-在VB中制作和使用菜单 ├─Example023-设计弹出菜单 ├─Example024-向菜单中添加图标 ├─Example025-动态装入菜单项 ├─Example026-动态创建控件 ├─Example027-具有动感的图片按钮 ├─Example029-图像的打印 ├─Example030-利用VB内部机制实现图像格式转换 ├─Example031-鼠标绘图 ├─Example032-旋转文字效果演示 ├─Example033-用WebBrowse控件显示GIF动画 ├─Example034-肾形图案 ├─Example035-函数图形 ├─Example036-图像的剪切、复制和粘贴 ├─Example037-任意旋转图像 ├─Example038-分割图像 ├─Example039-反转颜色 ├─Example040-生成各颜色分量的单色图像 ├─Example041-彩色图像转换为灰度图像 ├─Example042-图像的锐化 ├─Example043-浮雕效果 ├─Example044-降低图像的分辨率 ├─Example045-图像的放大 ├─Example046-图像的缩小 ├─Example047-淡入淡出效果 ├─Example048-图像的合成 ├─Example049-图像动画 ├─Example050-使用DED ├─Example051-父子关系的Command对象 ├─Example052-在DED中使用参数 ├─Example056-查找记录 ├─Example057-动态创建数据库 ├─Example058-复制数据库的结构 ├─Example059-调用COM对象操作数据库 ├─Example060-获得表的索引信息 ├─Example061-转换Access数据库为Excel文件 ├─Example062-访问Excel文件 ├─Example063-将Access表中数据按一定格式存储到Txt文件 ├─Example064-使用Access报表 ├─Example065-压缩和修复数据库 ├─Example066-设置数据库密码 ├─Example067-修改数据库密码 ├─Example068-使用Stream读写存储的图像 ├─Example069-绘制图表 ├─Example070-保存rtf文件到数据库中 ├─Example071-打开对话框 ├─Example072-保存对话框 ├─Example073-字体对话框 ├─Example074-颜色对话框 ├─Example075-输入对话框消息对话框 ├─Example076-同时打开多个文件并在多个窗口显示 ├─Example077-将文本以列表形式显示 ├─Example078-设置段落缩进 ├─Example079-密码形式的TextBox控件 ├─Example080-能自动选中文本的TextBox控件 ├─Example081-确定文本的行数 ├─Example082-自动滚屏功能 ├─Example083-MaskEdBox控件 ├─Example084-对ComboBox的输入进行检查 ├─Example085-ComboBox控件的自动查询技术 ├─Example086-在ListBox控件间移动列表项 ├─Example087-简单的文件浏览器 ├─Example088-使用ListView控件增强文件浏览器 ├─Example089-播放Flash动画 ├─Example090-MMControl控件播放多媒体文件 ├─Example091-判断控件类型 ├─Example092-Line控件 ├─Example093-使用Shape控件 ├─Example094-引入系统监视器 ├─Example095-媒体文件浏览器 ├─Example096-列表播放媒体文件 ├─Example097-在应用程序之间进行拖放操作 ├─Example098-文本文件的拖放操作 ├─Example099-图像和图像文件的拖放 ├─Example100-使用WebBrowser控件浏览网页 ├─Example101-属性 ├─Example102-复制文件(copyfile) ├─Example103-文件夹的创建~删除 ├─Example104-回收站 ├─Example105-清空回收站 ├─Example106-回收站察看器 ├─Example107-获取图标 ├─Example108-获取图标2 ├─Example109-写入读取2进制文件 ├─Example110-写入读取2进制文件2 ├─Example111-写入窗口大小位置 ├─Example112-文件ADD资料 ├─Example113-取驱动器名和信息 ├─Example114-查找文件 ├─Example115-注册表 ├─Example117-WindowText的信息传递 ├─Example118-查找窗口&信息传递 ├─Example119-信息拦截 ├─Example120-CD-ROM开关 ├─Example121-Word ├─Example122-得出(NetBIOS名,DNS主机名) ├─Example123 - IF操作系统 ├─Example124-重新启动 ├─Example125-热键 ├─Example126-系统时间修改(没事最好不要乱动) ├─Example127-注册表 ├─Example128-Detect(不知道是什么) ├─Example129-本地连接的IP ├─Example130-应用程序的超连接 ├─Example131-截取信息 ├─Example132-近文档信息 ├─Example133-Ctrl&V的应用 ├─Example134-鼠标(移动,左键,右键) ├─Example135-注册表&资源应用 ├─Example137-函数(Replace,Split,Join,StrReverse,InStrRev)的使用 ├─Example138-环境变量 ├─Example139-打开文件夹 ├─Example140-设置系统颜色 ├─Example141 - DSN建立 ├─Example142 - 字体 ├─Example143 - Time的计算 ├─Example145 ├─Example146-程序菜单的隐藏&显示 ├─Example147-自定义函数Function用法 ├─Example148-VB对Excel调用 ├─Example149-运行记事本 └─Example150-字符串长度

“相关推荐”对你有帮助么?

  • 非常没帮助
  • 没帮助
  • 一般
  • 有帮助
  • 非常有帮助
提交
评论
添加红包

请填写红包祝福语或标题

红包个数最小为10个

红包金额最低5元

当前余额3.43前往充值 >
需支付:10.00
成就一亿技术人!
领取后你会自动成为博主和红包主的粉丝 规则
hope_wisdom
发出的红包
实付
使用余额支付
点击重新获取
扫码支付
钱包余额 0

抵扣说明:

1.余额是钱包充值的虚拟货币,按照1:1的比例进行支付金额的抵扣。
2.余额无法直接购买下载,可以购买VIP、付费专栏及课程。

余额充值