Warning: file_get_contents(/data/phpspider/zhask/data//catemap/0/vba/14.json): failed to open stream: No such file or directory in /data/phpspider/zhask/libs/function.php on line 167

Warning: Invalid argument supplied for foreach() in /data/phpspider/zhask/libs/tag.function.php on line 1116

Notice: Undefined index: in /data/phpspider/zhask/libs/function.php on line 180

Warning: array_chunk() expects parameter 1 to be array, null given in /data/phpspider/zhask/libs/function.php on line 181
Vba 将高光从单元格延伸到行_Vba_Excel_Formatting - Fatal编程技术网

Vba 将高光从单元格延伸到行

Vba 将高光从单元格延伸到行,vba,excel,formatting,Vba,Excel,Formatting,这可能是一个非常愚蠢的问题。我想指出的是,我对VBA很陌生。 通过到处查看互联网,我成功地创建了以下代码,我使用这些代码突出显示包含特定日期的所有单元格。我现在想调整我的代码,并将highlighnt扩展到包含特定日期的单元格行,以便稍后我可以轻松地复制并通过它们进入新选项卡 Sub HighlightSpecificValue() Dim fnd As String, FirstFound As String Dim FoundDate As Range, rng As Range Dim

这可能是一个非常愚蠢的问题。我想指出的是,我对VBA很陌生。 通过到处查看互联网,我成功地创建了以下代码,我使用这些代码突出显示包含特定日期的所有单元格。我现在想调整我的代码,并将highlighnt扩展到包含特定日期的单元格行,以便稍后我可以轻松地复制并通过它们进入新选项卡

Sub HighlightSpecificValue()

Dim fnd As String, FirstFound As String
Dim FoundDate As Range, rng As Range
Dim myRange As Range, LastCell As Range
Dim datetoFind As Date

'Value to be found
fnd = InputBox("Emter the date to be found", "Highlight")

'End Macro if Cancel Button is Clicked or no Text is Entered
  If fnd = vbNullString Then Exit Sub

'Convert String value to date format
 datetoFind = DateValue(fnd)

Set myRange = Sheets("Tabelle1").Range("E:E")
Set LastCell = myRange.Cells(myRange.Cells.Count)
Set FoundDate = myRange.Find(what:=datetoFind, _
                        after:=LastCell, _
                        LookIn:=xlFormulas, _
                        LookAt:=xlPart, _
                        SearchOrder:=xlByRows, _
                        SearchDirection:=xlNext, _
                        MatchCase:=False, _
                        SearchFormat:=False)

'Test to see if anything was found
If Not FoundDate Is Nothing Then
FirstFound = FoundDate.Address
Else
GoTo NothingFound
End If

Set rng = FoundDate

'Loop until cycled through all unique finds
Do Until FoundDate Is Nothing
'Find next cell with fnd value
  Set FoundDate = myRange.FindNext(after:=FoundDate)

'Add found cell to rng range variable
  Set rng = Union(rng, FoundDate)

'Test to see if cycled through to first found cell
  If FoundDate.Address = FirstFound Then Exit Do

Loop

'Highlight Found cells yellow
rng.Interior.Color = RGB(255, 255, 0)

'Report Out Message
MsgBox rng.Cells.Count & " cell(s) were found containing: " & fnd

Exit Sub

'Error Handler
NothingFound:
MsgBox "No cells containing: " & fnd & " were found in this worksheet"

End Sub

提前感谢您宝贵的帮助

使用
Range
对象的
EntireRow
方法

rng.EntireRow.Interior.Color = RGB(255, 255, 0)