VBA - Find Text And Delete Entire Row
Sep 3, 2009
VBA for finding text through an Excel SS and deleting the entire row if the text is found.
For example if the string "STAD LLL" is present in any cell in any string position the entire row is then deleted.
View 9 Replies
ADVERTISEMENT
Aug 28, 2007
I've a worksheet containing a list of items some of which need deleting. These are identified from a particular range where users input "y" to notifiy the record can be removed. The code below works just fine if all I do is Clear the cells containing "y". However using: Range(rCell.Address).EntireRow.Delete
the macro stops after deleting the first item. It suddenly believes there aren't any further items to delete and Ends. There are no error messages returned. Entire macros is below.
Sub unreg_report()
Dim rRange As Range, rCell As Range
Set rRange = Range("unreg_list").SpecialCells _
(xlCellTypeConstants, xlTextValues)
For Each rCell In rRange
If rCell = "y" Then
Range(rCell.Address).EntireRow.Delete
End If
Next rCell
End Sub
View 2 Replies
View Related
Sep 18, 2008
I use the code below to delete the entire row that has the Text "Pc." in it. How can I make this delete the row with "Pc." plus the next row?
Sub PL()
Dim i As Long
For i = Cells(Rows.Count, "A").End(xlUp).Row To 1 Step -1
If InStr(Cells(i, "A").Text, "Pc.") Then
Cells(i, "A").EntireRow.Delete
End If
Next i
End Sub
View 9 Replies
View Related
Mar 26, 2007
Delete entire Row if cell in column contains "Dog" in it.?
Example,
duck321
dog123
cat123
dog123
duck321
cat123
so after it would look like this
duck321
cat123
duck321
cat123
View 9 Replies
View Related
Jul 12, 2007
I tried to writer my code myself but I have a long way to go. Here is what I must do for my case:
I want a macro to find the row that include a specific text (For example "SMSC") in a range (A1:A100) then copy this entire row below the cell which has the value "OTHERS". That is, if there are 10 pieces of "SMSC" so these rows including "SMSC" should be listed below the cell "OTHERS"
View 9 Replies
View Related
Aug 21, 2012
I'm trying to develop code that will perform the function in the title. I want to use an if statement that looks at cells across the worksheet and where it finds certain text it should colour the entire row. I would also like to be able to input the text via a user box. I don't necessarily want the code
View 3 Replies
View Related
Dec 2, 2009
I need to change the value of cells if column I contains the word error ....
View 14 Replies
View Related
May 17, 2008
I have a report that comes in a txt file. After importing into excel i am left with a bunch of garbage that i dont need. This report is anywhere from 5-15 pages depending on how much product was made that shift. I only need the information off of the 1st page. My question is how can i Find the first occurance of specific text (Site) (will be in column A) and have it select that row and all rows below and delete them.
My biggest issue is the first page can be anywhere from 40-60 rows so I need to find the text (Site) and delete everything below it, which could be anywhere from 500-1500 rows.
View 2 Replies
View Related
Dec 28, 2013
I'm looking for code to find a copy of the text in cell AH3 in a range AH7:AH100 then delete all copies of the text in that range AH7:AH100 leaving other cells in that range which contain different text intact.
View 3 Replies
View Related
Jun 10, 2008
I am trying to create a macro that will delete everything below a certain word.
The code I tried to use is the following. This produced an error:
If Range(Cells(1, 1), Cells(180, 1)). Find(" Interest Expense").Row = 0 Then
iStart = Range(Cells(1, 1), Cells(180, 1)).Find(" NET INCOME").Row + 1
Else
iStart = Range(Cells(1, 1), Cells(180, 1)).Find(" Interest Expense").Row + 1
End If
Rows(iStart & ":" & FinalRow).Delete shift:=xlUp
View 4 Replies
View Related
Sep 26, 2007
I am trying to move through the worksheets and delete all columns with "Accession" in contained in them. I have to do this with an external macro as the spreadsheet with the data is created from another program. I tried this and get an 'Object or With block variable not set' error and the debug highlights the Cells. Find line of the code.
Also, the number of columns could be variable within the spreadsheet as it is compiled by the other program.
Sub DelAccessionNum()
Dim Wrkst As Worksheet
For Each Wrkst In ActiveWorkbook.Worksheets
Cells.Find(What:="Accession", After:=ActiveCell, LookIn:=xlFormulas, LookAt:= _
xlPart, SearchOrder:=xlByRows, SearchDirection:=xlPrevious, MatchCase:=False _
, SearchFormat:=False).Activate
On Error Goto Completed:
Selection.EntireColumn.Delete Shift:=xlToLeft
Completed:
Next
End Sub
View 9 Replies
View Related
Oct 28, 2008
How would i search the entier worksheet im in, looking at column b only, and delete the entire row if i find the word Date in it.
View 9 Replies
View Related
Sep 24, 2006
when i delete the entirerow, it shifts the rows up (which is what I want) but it skips that row when it does.
so if I have 2 blank cells together it will delete the 1st and leave the 2nd blank.
Sub ()
Dim myrange As Range
Set myrange = ("a:a")
For Each c In myrange
If c.Value = "" Or c.Value <= 5 Then
c.EntireRow.Delete
End If
Next
End Sub
View 5 Replies
View Related
May 3, 2006
I'm working on Outlook 2003 and Word 2000 which are not compatible. I have an
Excel Sheet which are my contacts from Outlook and I want to re-work it to
have only a certain category left.
I need a macro that does
- search a certain column
- deletes the row if it does NOT find a certain condition
Ideal would be a little pop up window to enter which category I want left.
View 9 Replies
View Related
Dec 11, 2012
I written one code to delete Entirerow if value match. It's working fine .the code delete all match except one match.!
-------------------------------------------------
Option Compare Text
Sub delete_duplicate()
Cells(Rows.Count, 1).End(xlUp).Select
Range(ActiveCell, Range("A1")).Select
For Each cell In Selection
If cell.Value = "Already updated" Then
cell.EntireRow.Delete
End If
Next
End Sub
-----------------------------------
View 3 Replies
View Related
Aug 19, 2013
I'm having some problem with a part of my code that deletes entire columns. With ActiveCell as my reference, I want to delete 'Abs_Diff' Columns to the left hand side of the ActiveCell column, including the ActiveCell column. 'Abs_Diff' is a variable of integer type.
SO if ActiveCell column is "P" and 'Abs_Diff'=2, then delete Columns "O:P"
if ActiveCell column is "P" and 'Abs_Diff'=4, then delete Columns "M:P"
My code is selecting columns incorrectly, maybe due to merged cells in cols A,B,C or something..not sure.
Here is my code:
Code:
'DELETE COLUMNS
Set StartPoint = ActiveCell
For X = 1 To Abs_Diff
StartPoint.EntireColumn.Delete
Set StartPoint = ActiveCell.Offset(0, -1)
Next X
View 1 Replies
View Related
Mar 17, 2014
If column B contains the word FALSE, I need to delete that entire row, then I need to repeat this action on 11 sheets out of 14 on one workbook, in one action.
View 6 Replies
View Related
Feb 17, 2010
i have over around 1500 pfolios in Col A, i need macro that will delete entire row which has the highlighted pfolios. Now i tried advanced filter which would work but the date in Col A6 will change every month, so dont want to go down that road, is there alternative option other than advanced filter ..
View 9 Replies
View Related
Apr 26, 2007
I am trying to Lookup multiple values (can't be done manually) in one report (Report 2) from another (Report 1).
If the value from Report 1 isn't present in Report 2, I want the entire row the value is found in (From Report 1) deleted.
View 4 Replies
View Related
Jun 29, 2007
I want to know if there is a way to delete an entire row from an array? I have a 2 dimensional array and I want to loop through the elements in the first column and delete an entire row based on some conditions. Since the number of rows are too many usual looping takes a long time so I want to use an array.
View 9 Replies
View Related
Oct 1, 2012
I have two worksheet. One worksheet (ws1) contains a list of item I want. The other sheet (ws2) contains multiple columns where the header (row 6) is named by item name.
I have the following code which deletes the entire column if the header name is not in the list contained in ws1 :
VB:
Sub delete_col()
Dim wanted As Boolean
Set ws1 = Workbooks("test1").Sheets("aaa")
[Code]....
First of all, this loop does not work properly since deleting the entire column shift them on the left, so when I first analyze column 11, if I delete it and then analyze column 12, the real column 12 now became column 11 and so on...
Secondly, this code is pretty slow. I am pretty sure I don't have to loop through my initial item list everytime I do Instr on a new column.
View 9 Replies
View Related
Feb 21, 2013
I have columns
Row 1 is heading..
IF Column C doesn't have data in entire column then delete C D E F
IF Column D doesn't have data in entire column then delete D E F
IF Column E doesn't have data in entire column then delete E F
IF Column F doesn't have data in entire column then delete F
Same way for heading NN's
IF Column G doesn't have data in entire column then delete G H I J K L M N
IF Column H doesn't have data in entire column then delete H I J K L M N
IF Column I doesn't have data in entire column then delete I J K L M N
IF Column J doesn't have data in entire column then delete J K L M N
IF Column K doesn't have data in entire column then delete K L M N
IF Column L doesn't have data in entire column then delete L M N
IF Column M doesn't have data in entire column then delete M N
IF Column N doesn't have data in entire column then delete N
View 1 Replies
View Related
Apr 15, 2014
i want to delete entire row if D2:D10000 has a numeric value e.g .111 to 100000.1114
View 4 Replies
View Related
Apr 16, 2014
i want to delete entire row if Column C2:C1000 are blank
e.g if range c2:c100 have data then delete the rows C101:C1000
View 3 Replies
View Related
May 5, 2014
I have fixed headers on row 16, from columns A-AC.
I want to be able to delete the entire column, if the row has a certain string, such as "Chart ID" .
I also want to expand it to include other strings such as "Month" and "Source" . So if it contains any of these words, the columns should be deleted. It should be an exact match (as other headers contain the word "month").
View 12 Replies
View Related
Jun 16, 2014
I have table in which against the Column A data values are added in Column B, C and D.
If Column B,C and D cell values is 0, then I want entire row including A to be deleted. How can I do this in VBA?
Note: Column A data begins from Row 15 and below.
Just to avoid confusion. I want row deletion, only when all the three cell on B,C and D is = 0
View 7 Replies
View Related
Jun 15, 2011
I have a file with 238 rows and 10 columns (see file attached) Column G include phone numbers, some phone numbers are duplicated.
How can I use a macro (I must do it with a macro) to delete the ENTIRE row if the value in column G is the same in other row?
For example: look at rows 2 and 3 : the value in column G2 and G3 is the same, therefor delete row 3
(and if the value in G4 was also the same, then delete also row 4, and so on..)
View 10 Replies
View Related
May 13, 2009
I have a problem deleting rows based on a condition, i didn't know how to use offset method.
i'm using a table like this one :
A B C
1 Main design1 FFR0
2 Extra design2 FFR0
3 Main design3 FFR0
4 Extra design4 FFR0
.
.
n Main designn FFR0
I want to delete entire row if "FFR0" in column C exists in a row beginning by "EXTRA" (column A)
View 6 Replies
View Related
May 27, 2009
I have a worksheet where I have restricted the users from scrolling around beyond a certain range.
Because of that the user is prevented from selecting an entire row.
There are some cases where the user should be able to delete entire row or range of rows.
How can I allow them to select say cells "C17:C35" [they would just hoghlight the range] and hit ctrl+d; which would trigger a macro and the macro in turn would delete all the rows in that selection [rows 17 through 35]?
I know some basic codes for deleting entire rows, but I don't know how to read first and last row of the selection under Target property.
View 3 Replies
View Related
Dec 12, 2009
In range A1:A300 I have a lotof words. What I want is to delete entire row if the cell value is Open date
View 3 Replies
View Related