Bill, try something like:
Range("A65536").End(xlUp).Address
Regards,
BarrieBarrie Davidson
Bill,
You can use the following function.
'Returns the number of the last worksheet row with data. It returns 0 if the sheet is blank.
'=================================================Function GetBottomRow() As Long
On Error GoTo NoRow
GetBottomRow = Cells.Find(what:="*", SearchOrder:=xlByRows, _
SearchDirection:=xlPrevious).Row
Exit Function
NoRow:
GetBottomRow = 0
End Function
================================================
You can call it like this:
Dim LastRow as Long
LastRow = GetBottomRow
Regards,
Jim Cone
San Jose, CA
************************************************
Hi Bill
To check all columns to find the lowest row used I prefer this: (as usual, it will include any cell containing just a space)
Count = 0
For Each Cell In [A65536:IV65536]
If Cell.End(xlUp).Row > Count Then
Count = Cell.End(xlUp).Row
End If
Next Cell
MsgBox "" & Count
End Sub
Cheers
Derek