“Excel VBA Hapus baris kosong” Kode Jawaban

Baris dlete dengan kosong dan ruang "" VBA

Dim iCounter As Long
With Application
    .Calculation = xlCalculationManual
    .ScreenUpdating = False
    For iCounter = Selection.Rows.Count To 1 Step -1
        If WorksheetFunction.CountA(Selection.Rows(iCounter)) = 0 Then
            Selection.Rows(iCounter).EntireRow.Delete
        End If
    Next iCounter
    .Calculation = xlCalculationAutomatic
    .ScreenUpdating = True
End With
Inquisitive Ibis

Excel VBA Hapus baris kosong

' Deletes empty rows
dim rRange As Range, rowsCount As Long, i As Long
Set rRange = ActiveSheet.Range("A1:B100")
rowsCount = rRange.rows.Count
For i = rowsCount To 1 Step -1
    If WorksheetFunction.CountA(rRanges.rows(i)) = 0 Then 
        rRange.rows(i).Delete
    End If
Next
VasteMonde

Jawaban yang mirip dengan “Excel VBA Hapus baris kosong”

Pertanyaan yang mirip dengan “Excel VBA Hapus baris kosong”

Lebih banyak jawaban terkait untuk “Excel VBA Hapus baris kosong” di VBA

Jelajahi jawaban kode populer menurut bahasa

Jelajahi bahasa kode lainnya