如何改变 Command1.Caption 的 ForeColor

zou19820704 2005-10-31 10:29:46
我现在需要改变命令按纽的前竟色为白色,不知道怎么去改变他!
高手帮忙
...全文
258 11 打赏 收藏 转发到动态 举报
写回复
用AI写文章
11 条回复
切换为时间正序
请发表友善的回复…
发表回复
zou19820704 2005-11-04
  • 打赏
  • 举报
回复
快来帮帮我呀!!
zodane 2005-11-04
  • 打赏
  • 举报
回复
你改用别的控件做按钮呢?
label ,image ,都很好做的啊。
province_ 2005-11-04
  • 打赏
  • 举报
回复
或者你使用FORM2。0里的按钮,许多效果都是不错的。
zou19820704 2005-10-31
  • 打赏
  • 举报
回复
check1.value= 1 的时候不符合我的要求呀,我需要按下和不按都是背景色不改变的
rainstormmaster 2005-10-31
  • 打赏
  • 举报
回复
或者用checkbox控件(有forecolor属性)代替按钮,设置其style属性为1:
Private Sub Check1_Click()
Check1.Value = 0
End Sub
zou19820704 2005-10-31
  • 打赏
  • 举报
回复
太多了,我自己做一个得了,呵呵,谢谢你楼上的兄弟
shortppsy 2005-10-31
  • 打赏
  • 举报
回复
可以这样做,不过很复杂,建议你用其他的按钮控件,或者自己画一个

更变command文字前景色

Option Explicit

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

Private Declare Function GetParent Lib "user32" _
(ByVal hWnd As Long) As Long

Private Declare Function GetWindowLong Lib "user32" Alias _
"GetWindowLongA" (ByVal hWnd As Long, _
ByVal nIndex As Long) As Long
Private Declare Function SetWindowLong Lib "user32" Alias _
"SetWindowLongA" (ByVal hWnd As Long, ByVal nIndex As Long, _
ByVal dwNewLong As Long) As Long
Private Const GWL_WNDPROC = (-4)

Private Declare Function GetProp Lib "user32" Alias "GetPropA" _
(ByVal hWnd As Long, ByVal lpString As String) As Long
Private Declare Function SetProp Lib "user32" Alias "SetPropA" _
(ByVal hWnd As Long, ByVal lpString As String, _
ByVal hData As Long) As Long
Private Declare Function RemoveProp Lib "user32" Alias _
"RemovePropA" (ByVal hWnd As Long, _
ByVal lpString As String) As Long

Private Declare Function CallWindowProc Lib "user32" Alias _
"CallWindowProcA" (ByVal lpPrevWndFunc As Long, _
ByVal hWnd As Long, ByVal Msg As Long, ByVal wParam As Long, _
ByVal lParam As Long) As Long

Private Declare Sub CopyMemory Lib "kernel32" Alias "RtlMoveMemory" _
(Destination As Any, Source As Any, ByVal Length As Long)

'Owner draw constants
Private Const ODT_BUTTON = 4
Private Const ODS_SELECTED = &H1
'Window messages we're using
Private Const WM_DESTROY = &H2
Private Const WM_DRAWITEM = &H2B

Private Type DRAWITEMSTRUCT
CtlType As Long
CtlID As Long
itemID As Long
itemAction As Long
itemState As Long
hwndItem As Long
hDC As Long
rcItem As RECT
itemData As Long
End Type

Private Declare Function GetWindowText Lib "user32" Alias _
"GetWindowTextA" (ByVal hWnd As Long, ByVal lpString As String, _
ByVal cch As Long) As Long
'Various GDI painting-related functions
Private Declare Function DrawText Lib "user32" Alias "DrawTextA" _
(ByVal hDC As Long, ByVal lpStr As String, ByVal nCount As Long, _
lpRect As RECT, ByVal wFormat As Long) As Long
Private Declare Function SetTextColor Lib "gdi32" (ByVal hDC As Long, _
ByVal crColor As Long) As Long
Private Declare Function SetBkMode Lib "gdi32" (ByVal hDC As Long, _
ByVal nBkMode As Long) As Long
Private Const TRANSPARENT = 1

Private Const DT_CENTER = &H1
Public Enum TextVAligns
DT_VCENTER = &H4
DT_BOTTOM = &H8
End Enum
Private Const DT_SINGLELINE = &H20


Private Sub DrawButton(ByVal hWnd As Long, ByVal hDC As Long, _
rct As RECT, ByVal nState As Long)

Dim s As String
Dim va As TextVAligns

va = GetProp(hWnd, "VBTVAlign")

'Prepare DC for drawing
SetBkMode hDC, TRANSPARENT
SetTextColor hDC, GetProp(hWnd, "VBTForeColor")

'Prepare a text buffer
s = String$(255, 0)
'What should we print on the button?
GetWindowText hWnd, s, 255
'Trim off nulls
s = Left$(s, InStr(s, Chr$(0)) - 1)

If va = DT_BOTTOM Then
'Adjust specially for VB's CommandButton control
rct.Bottom = rct.Bottom - 4
End If

If (nState And ODS_SELECTED) = ODS_SELECTED Then
'Button is in down state - offset
'the text
rct.Left = rct.Left + 1
rct.Right = rct.Right + 1
rct.Bottom = rct.Bottom + 1
rct.Top = rct.Top + 1
End If

DrawText hDC, s, Len(s), rct, DT_CENTER Or DT_SINGLELINE _
Or va

End Sub

Public Function ExtButtonProc(ByVal hWnd As Long, _
ByVal wMsg As Long, ByVal wParam As Long, _
ByVal lParam As Long) As Long

Dim lOldProc As Long
Dim di As DRAWITEMSTRUCT

lOldProc = GetProp(hWnd, "ExtBtnProc")

ExtButtonProc = CallWindowProc(lOldProc, hWnd, wMsg, wParam, lParam)

If wMsg = WM_DRAWITEM Then
CopyMemory di, ByVal lParam, Len(di)
If di.CtlType = ODT_BUTTON Then
If GetProp(di.hwndItem, "VBTCustom") = 1 Then
DrawButton di.hwndItem, di.hDC, di.rcItem, _
di.itemState

End If

End If

ElseIf wMsg = WM_DESTROY Then
ExtButtonUnSubclass hWnd

End If

End Function

Public Sub ExtButtonSubclass(hWndForm As Long)

Dim l As Long

l = GetProp(hWndForm, "ExtBtnProc")
If l <> 0 Then
'Already subclassed
Exit Sub
End If

SetProp hWndForm, "ExtBtnProc", _
GetWindowLong(hWndForm, GWL_WNDPROC)
SetWindowLong hWndForm, GWL_WNDPROC, AddressOf ExtButtonProc

End Sub

Public Sub ExtButtonUnSubclass(hWndForm As Long)

Dim l As Long

l = GetProp(hWndForm, "ExtBtnProc")
If l = 0 Then
'Isn't subclassed
Exit Sub
End If

SetWindowLong hWndForm, GWL_WNDPROC, l
RemoveProp hWndForm, "ExtBtnProc"

End Sub

Public Sub SetButtonForecolor(ByVal hWnd As Long, _
ByVal lForeColor As Long, _
Optional ByVal VAlign As TextVAligns = DT_VCENTER)

Dim hWndParent As Long

hWndParent = GetParent(hWnd)
If GetProp(hWndParent, "ExtBtnProc") = 0 Then
ExtButtonSubclass hWndParent
End If

SetProp hWnd, "VBTCustom", 1
SetProp hWnd, "VBTForeColor", lForeColor
SetProp hWnd, "VBTVAlign", VAlign

End Sub

Public Sub RemoveButton(ByVal hWnd As Long)

RemoveProp hWnd, "VBTCustom"
RemoveProp hWnd, "VBTForeColor"
RemoveProp hWnd, "VBTVAlign"

End Sub



Private Sub Form_Load()
SetButtonForecolor Command1.hWnd, vbBlue
End Sub



Private Sub Command2_Click()
RemoveButton Command1.hWnd
Command1.Refresh
End Sub


northwolves 2005-10-31
  • 打赏
  • 举报
回复
我现在需要改变命令按纽的前竟色为白色
------------------------------------
可以将按钮效果做成图片,LOADPICTURE加载到图片的PICTURE属性上
lxcy 2005-10-31
  • 打赏
  • 举报
回复
用楼上方法,何须那么麻烦
rainstormmaster 2005-10-31
  • 打赏
  • 举报
回复
//check1.value= 1 的时候不符合我的要求呀,我需要按下和不按都是背景色不改变的

没看懂,你的checkbox按下后背景色会改变吗
zou19820704 2005-10-31
  • 打赏
  • 举报
回复
等....
用vb编写的函数作图软件的代码: Const Pi = 3.1415926535 '定义圆周率 Dim a, wor '定义用于在Picture1上的一个位置打印字符函数 Private Function PrintWord(X, Y, Word As String) With Picture1 .CurrentX = X .CurrentY = Y .ForeColor = RGB(0, 0, 255) End With Picture1.Print Word End Function '定义画点函数 Private Function DrawDot(Px, Py, Color) Picture1.PSet (Px, Py), Color End Function Sub XY() '建立直角坐标系 Picture1.DrawWidth = 1 '设置线条宽度 Picture1.Cls '设定用户坐标系,坐标原点在Picture1中心 Picture1.Scale (-10, 10)-(10, -10) Picture1.Line (-10, 0)-(10, 0), RGB(0, 0, 255) Picture1.Line -(9.5, 0.5), RGB(0, 0, 255) Picture1.Line (10, 0)-(9.5, -0.5), RGB(0, 0, 255) Picture1.ForeColor = RGB(0, 0, 255) Picture1.Print "X" '画 X 轴 Picture1.Line (0, -10)-(0, 10), RGB(0, 0, 255) Picture1.Line -(0.5, 9.5), RGB(0, 0, 255) Picture1.Line (0, 10)-(-0.5, 9.5), RGB(0, 0, 255) Picture1.Print "Y" '画 Y 轴 For lin = -9 To 9 Picture1.Line (lin, 0)-(lin, 0.25) wor = PrintWord(lin - 0.5, -0.5, Str(lin)) Picture1.Line (0, lin)-(-0.25, lin) If lin <> 0 Then wor = PrintWord(-0.9, lin, Str(lin)) End If Next lin Picture1.DrawWidth = 2 End Sub Private Sub Command1_Click() '画正弦曲线 '用For循环绘点,使其按正弦规律变化。 '步长小,使曲线比较平滑,还能形成动画效果 b = InputBox("输入振幅", "") c = InputBox("输入周期", "") d = InputBox("输入初相", "") h = InputBox("输入平衡位置", "") Cls XY For a = -2 * Pi / c To 2 * Pi / c Step Pi / 6000 Dot = DrawDot(a, Sin(c * a + d) * b + h, RGB(0, 255, 0)) Next a Picture2.Print "振幅b="; b Picture2.Print "周期c="; c Picture2.Print "初相d="; d Picture2.Print "平衡位置h="; h wor = PrintWord(3, -6, "正弦曲线 y=bsin(cx+d)+h") End Sub Private Sub Command2_Click() '画正弦曲线 '用For循环绘点,使其按正弦规律变化。 '步长小,使曲线比较平滑,还能形成动画效果 b = InputBox("输入振幅", "") c = InputBox("输入周期", "") d = InputBox("输入初相", "") h = InputBox("输入平衡位置", "") Cls XY For a = -2 * Pi / c To 2 * Pi / c Step Pi / 6000 Dot = DrawDot(a, Cos(c * a + d) * b + h, RGB(0, 255, 0)) Next a Picture2.Print "振幅b="; b Picture2.Print "周期c="; c Picture2.Print "初相d="; d Picture2.Print "平衡位置h="; h wor = PrintWord(3, -6, "正弦曲线 y=bcos(cx+d)+h") End Sub Private Sub Command3_Click() XY End Sub Private Sub Form_Load() Form1.Width = 14000 Form1.Height = 10000 Picture1.Width = 4 * Form1.Width / 5 Picture1.Height = 9 * Form1.Height / 10 Picture1.Left = Form1.Width / 10 Picture1.Top = Form1.Height / 160 Picture2.Width = 1 * Form1.Width / 12 Picture2.Height = 9 * Form1.Height / 10 Picture2.Left = 21 * Form1.Width / 24 Picture2.Top = Form1.Height / 160 Command1.Width = 2 * Form1.Width / 23 Command1.Height = 2 * Form1.Height / 53 Command1.Left = Form1.Width / 350 Command1.Top = Form1.Height / 160 Command2.Width = 2 * Form1.Width / 23 Command2.Height = 2 * Form1.Height / 53 Command2.Left = Form1.Width / 350 Command2.Top = 40 * Form1.Height / 160 Command3.Width = 2 * Form1.Width / 23 Command3.Height = 2 * Form1.Height / 53 Command3.Left = Form1.Width / 350 Command3.Top = 80 * Form1.Height / 160 Command4.Width = 2 * Form1.Width / 23 Command4.Height = 2 * Form1.Height / 53 Command4.Left = Form1.Width / 350 Command4.Top = 120 * Form1.Height / 160 Command1.Caption = "正弦曲线" Command2.Caption = "余弦曲线" Command3.Caption = "清空" Command4.Caption = "宁永明" Picture1.BackColor = vbWhite End Sub
Dim n As Integer, Lines As Integer, i As Integer, w As Integer, a As Boolean Private Sub Command1_Click() Command6.Visible = False a = Not a '变量开关,再次打开文件时进行判断 If a = True Then no1: Dim infile As String '打开通用对话框,获取文件名称 CommonDialog1.InitDir = "" CommonDialog1.Filter = "文本文件(*.txt)|*.txt|所有文件(*.*)|*.*" CommonDialog1.FilterIndex = 1 CommonDialog1.ShowOpen infile = CommonDialog1.FileName Dim txt() As String, Lines As Integer Lines = 0 ' 文件行数总计 Open infile For Input As #1 'infile 变量中存放的是文本文件的名字 While Not EOF(1) ReDim Preserve txt(Lines + 1) '开辟空间以存放一行内容 Lines = Lines + 1 Line Input #1, txt(Lines) '读入一行并放入数组 Wend w = Lines Close #1 '关闭文件 Label1(1) = txt(1) Label1(1).Top = Command1.Height Label1(1).Left = 0 Label1(1).Width = Form1.Width '加载label控件数组并读入文本 For n = 2 To Lines Load Label1(n) 'Form1.width = Label1(n).width Label1(n).Left = 0 Label1(n).AutoSize = True Label1(n).WordWrap = True Label1(n).Width = Form1.Width Label1(n).Caption = txt(n) Label1(n).Visible = True Label1(n).Top = Label1(n - 1).Height + Label1(n - 1).Top Label1(n).Left = Label1(1).Left Next Else Call Command6_Click a = Not a GoTo no1 End If End Sub Private Sub Command2_Click() '减少interval Timer1.Interval = Timer1.Interval - 25 End Sub Private Sub Command3_Click() '增加interval Timer1.Interval = Timer1.Interval + 30 End Sub Private Sub Command4_Click() '打开“字体”对话框 CommonDialog1.Flags = cdlCFBoth Or cdlCFEffects On Error GoTo errhandler CommonDialog1.ShowFont '设置label1控件数组内容的属性 For i = 1 To w Label1(i).FontName = CommonDialog1.FontName Label1(i).FontBold = CommonDialog1.FontBold Label1(i).FontItalic = CommonDialog1.FontItalic Label1(i).FontSize = CommonDialog1.FontSize Label1(i).FontStrikethru = CommonDialog1.FontStrikethru Label1(i).FontUnderline = CommonDialog1.FontUnderline Label1(i).ForeColor = CommonDialog1.Color Label1(i).AutoSize = True Label1(i).WordWrap = True '根据label1控件数组的大小进行重新排列 For n = 2 To w Label1(n).Top = Label1(n - 1).Top + Label1(n - 1).Height Next Next errhandler: Exit Sub End Sub Private Sub Command5_Click() End End Sub Private Sub Command6_Click() Command6.Visible = False '再次打开文件时卸载label1控件数组 For n = 2 To w Unload Label1(n) Next End Sub Private Sub Command7_Click() '从头显示文件内容 Label1(1).Top = Command1.Height For i = 2 To w Label1(i).Top = Label1(i - 1).Top + Label1(i - 1).Height Next End Sub Private Sub Form_Load() Timer1.Interval = 300 End Sub Private Sub Label1_Click(Index As Integer) '控制滚屏,及命令按钮的隐现 Timer1.Enabled = Not Timer1.Enabled Command1.Visible = Not Timer1.Enabled Command2.Visible = Not Timer1.Enabled Command3.Visible = Not Timer1.Enabled Command4.Visible = Not Timer1.Enabled Command5.Visible = Not Timer1.Enabled Command7.Visible = Not Timer1.Enabled End Sub Private Sub Timer1_Timer() For i = 1 To w Label1(i).Top = Label1(i).Top - 90 Next '到达文件尾自动停止滚屏并显示命令按钮 If Label1(w).Top + Label1(w).Height < Form1.Height - 400 Then Timer1.Enabled = False Command1.Visible = True Command2.Visible = True Command3.Visible = True Command4.Visible = True Command5.Visible = True Command7.Visible = True MsgBox "文章已经到头" End If End Sub 做vb
Dim b As Single Dim a(9, 9) As Integer Dim b1(9, 9) As Integer Dim b2(9, 9) As Integer Dim cmd(9, 9) As CommandButton Dim lab(9, 9) As Label Private Sub Command1_Click(Index As Integer) x = Index: i = x \ 10: j = x Mod 10 If a(i, j) = 1 Then Call baozha ElseIf leishu(i, j) = 0 Then Call fan(i, j) Else cmd(i, j).Visible = False End If End Sub Private Sub Command1_MouseDown(Index As Integer, Button As Integer, Shift As Integer, x As Single, y As Single) If Button = 2 Then n = Index: i = n \ 10: j = n Mod 10 If cmd(i, j).Caption = "?" Then cmd(i, j).Caption = "" Me.Tag = Me.Tag + 1: Text1.Text = Me.Tag If a(i, j) = 1 Then b1(i, j) = 1 Else cmd(i, j).Caption = "?" Me.Tag = Me.Tag - 1: Text1.Text = Me.Tag End If End If If Me.Tag = 0 Then Call jianyan End Sub Private Sub Command2_Click() Picture1.Enabled = True For i = 0 To 9 For j = 0 To 9 a(i, j) = 0 cmd(i, j).Visible = True cmd(i, j).Caption = "" Next Next Call bulei(b) End Sub Private Sub Command3_Click() b = 10 Picture1.Enabled = True For i = 0 To 9 For j = 0 To 9 a(i, j) = 0 cmd(i, j).Visible = True cmd(i, j).Caption = "" Next Next b = 10 Call bulei(b) End Sub Private Sub Command4_Click() b = 10 Picture1.Enabled = True For i = 0 To 9 For j = 0 To 9 a(i, j) = 0 cmd(i, j).Visible = True cmd(i, j).Caption = "" Next Next b = 15 Call bulei(b) End Sub Private Sub Command5_Click() b = 10 Picture1.Enabled = True For i = 0 To 9 For j = 0 To 9 a(i, j) = 0 cmd(i, j).Visible = True cmd(i, j).Caption = "" Next Next b = 20 Call bulei(b) End Sub Private Sub Form_Load() b = 10 Picture1.Move 0, 0 Picture1.Height = (Command1(0).Height + 5) * 10 + 3 Picture1.Width = (Command1(0).Height + 5) * 10 + 3 Me.Height = Picture1.Height + 560 Me.Width = Picture1.Width + Frame1.Width + 260 Label1(0).Move 0, 0 Command1(0).Move 0, 0 Frame1.Move Picture1.Width + 60, 650 Command3.Move Picture1.Width + 80, 100 Command4.Move Picture1.Width + 180 + 375, 100 Command5.Move Picture1.Width + 280 + 750, 100 Set lab(0, 0) = Label1(0) Set cmd(0, 0) = Command1(0) For n = 1 To 99 i = n \ 10: j = n Mod 10 Load Label1(n) Set lab(i, j) = Label1(n) Load Command1(n) Set cmd(i, j) = Command1(n) With lab(i, j) .Left = 5 + j * lab(0, 0).Width .Top = 5 + i * lab(0, 0).Height .Visible = True End With With cmd(i, j) .Left = 5 + j * cmd(0, 0).Width .Top = 5 + i * cmd(0, 0).Height .Visible = True End With Next Call bulei(b) End Sub Private Sub bulei(b) Dim i, j, k As Integer Randomize For n = 1 To b k = Int(Rnd * (100 - n)) + 1 i = k \ 10: j = k Mod 10 Do While a(i, j) = 1 k = Int(Rnd * (100 - n)) + 1 i = k \ 10: j = k Mod 10 Loop a(i, j) = 1: b1(i, j) = 1 Next For i = 0 To 9 For j = 0 To 9 b2(i, j) = leishu(i, j) Select Case b2(i, j) Case 1 lab(i, j).ForeColor = RGB(0, 0, 255) Case 2 lab(i, j).ForeColor = RGB(255, 0, 0) Case 3 lab(i, j).ForeColor = RGB(0, 127, 0) Case 4 lab(i, j).ForeColor = RGB(0, 255, 255) Case 5 lab(i, j).ForeColor = RGB(255, 255, 0) Case Else lab(i, j).ForeColor = RGB(255, 0, 255) End Select lab(i, j).Caption = IIf(b2(i, j) = 0, "", b2(i, j)) Next Next Label2.Caption = "游戏开始" Me.Tag = b: Text1.Text = b End Sub Private Function leishu(x, y) k = 0 For i = IIf(x = 0, 0, x - 1) To IIf(x = 9, 9, x + 1) For j = IIf(y = 0, 0, y - 1) To IIf(y = 9, 9, y + 1) k = k + a(i, j) Next Next leishu = k End Function Private Sub baozha() For i = 0 To 9 For j = 0 To 9 If a(i, j) = 1 Then cmd(i, j).Caption = "!" Next Next Picture1.Enabled = False Label2.Caption = "你输了!" End Sub Private Sub jianyan() For i = 0 To 9 For j = 0 To 9 If a(i, j) = 1 And cmd(i, j).Caption = "" Then Exit Sub If cmd(i, j).Caption = "" Then cmd(i, j).Visible = False Next Next Picture1.Enabled = False Label2.Caption = "你赢了!" End Sub Private Sub fan(x, y) For i = IIf(x = 0, 0, x - 1) To IIf(x = 9, 9, x + 1) For j = IIf(y = 0, 0, y - 1) To IIf(y = 9, 9, y + 1) If cmd(i, j).Visible = True Then cmd(i, j).Visible = False If leishu(i, j) = 0 Then Call fan(i, j) End If Next Next End Sub
P12、 1.1 简述Visual Basic 的特点。 答:(l)可视化的设计平台;(2)面向对象的程序设计;(3)事件驱动的编程机制;(4)结构化的设计语言;(5)充分利用Windows资源;(6)开放的数据库功能与网络支持 P30、 2.1 什么是对象的属性、事件和方法? 答:对象的属性是指对象所具有的性质,不同的对象具有不同的属性。事件泛指能被对象识别的用户操作动作或对象状态的变化发出的信息,也即对象的响应。方法是指对象本身所具有的、反映该对象功能的内部函数或过程,也即对象的动作。 2.4 简述VB可视化编程的一般步骤。 答:1、新建一个工程2、添加控件3、设置属性4、编写代码5、运行工程6、修改工程7、保存工程 P47、 3.2 下列哪个符号不能作为VB中的变量名? (1)ABCabc (2)b1234 (3)28wed (4)cmd 答:(3)28wed 不能作为VB中的变量,在VB中变量名第一个字符必须是英文字母。 3.3 下列符号哪一个是VB中的合法变量名? (1)x23 (2)8xy (3)END (4)X8[B] 答:(1)x23 为合法变量名。 3.8 表达式2*3^2+2*8/4+3^2的值为: (1)64 (2)31 (3)49 (4)22 答:(2)31 P48、 3.14 函数Int(Rnd(0)*100)是在下列哪个范围内的整数? (1)(0,10) (2)(1,100) (3)(0,99) (4)(1,99) 答:(3)(0,99) 3.16 数学式子 sin30° 写成VB表达式是: (1)Sin30° (2)Sin(30) (3)SIN(30°) (4)Sin(30*3.14/180) 答:(2)Sin(30) P67、 4.1 利用标签控件制作阴影文字,文字内容设为“缤纷世界”。提示:利用标签控件的Top、Left与BackStyle属性。 解: Private Sub Command1_Click() Label1.Caption = "缤纷世界" Label2.Caption = "缤纷世界" Label1.Top = Label1.Top - 0 Label1.Left = Label1.Left - 0 Label1.BackStyle = 0 Label2.Top = Label1.Top + 50 Label2.Left = Label1.Left + 50 Label2.BackStyle = 0 Label2.ForeColor = &HFFFF& End Sub

7,763

社区成员

发帖
与我相关
我的任务
社区描述
VB 基础类
社区管理员
  • VB基础类社区
加入社区
  • 近7日
  • 近30日
  • 至今
社区公告
暂无公告

试试用AI创作助手写篇文章吧