VBA To Delete Column If Certain Cell Is Blank

Jun 20, 2014

I need a code that will delete an entire column (J) if J6 is blank.

View 3 Replies


ADVERTISEMENT

Delete Row If Blank Cell In Column

Jan 8, 2008

way to find blank cells in a column(s) and delete the rows corresponding to the cell number. I found this code in one of the previous threads on ozgrid but it just doesnt work for me because it is slowing me down. Please help (I am working on around 60000 rows in Excel 2007)

Sub DeleteBlankARows()
With Application
.Calculation = xlCalculationManual
. ScreenUpdating = False
Dim r As Long
For r = Cells(Rows.Count, 11).End(xlUp).Row To 1 Step -1
If Cells(r, 11) = "" Then Rows(r).Delete
Next r
.Calculation = xlCalculationAutomatic
.ScreenUpdating = True
End With
End Sub

a way to do the reverse viz. for a particular column, I'd like to delete the row corresponding to the non-blank cell in the column.

View 9 Replies View Related

Delete Row If Non-blank Cell In Column

Jan 17, 2008

Yes thats exactly what I am looking for. deleting rows if a cell in a particular column is not empty/has data.

View 7 Replies View Related

How To Delete Blank Column Based On Cell Value

Feb 22, 2014

I have this sheet(sheet2) with some data , I have 2 macro, my problems at this time is that I am looking for macro that delete only the blank rows that under the rows with {SELECT ....} and the under the blank rows with {CELL-ENTER......} and all the rest blank leave in place , I am also looking for option to integrate the new macro with the existing one and come up with one macro that I can refer to click button , in case that it is unfeasible , it's ok with me , I just will call the other macro at the from the first macro that I have.

View 4 Replies View Related

Delete ALL Rows That Have Cell In Column (J) That Looks Blank

Feb 11, 2010

I'm trying to delete rows which has columns that appears to be blank. Below code worked fine but it took about 15 min for the macro to work through the spreadsheet.

View 2 Replies View Related

Delete Or Clear A Row If Cell In Column Is Blank

Oct 24, 2009

Is there a way to delete or clear a row on exit if no end date has gone into it. i.e. if the user clicks on the X button in the top right hand corner.

Every time the user clicks on start the date goes into the next empty row, if finish is clicked then the end date will go into the cell next to it. See example below. Here the user has started and ended correctly

column
AB
StartEnd
24/10/09 24/10/09
24/10/09 24/10/09

In the example below the user has forgotten to click on the finish button when they first clicked on start, they exited excel instead and no end date was inputted. When the user clicked on start again the start date went to the row below, however as there was no end date the last time, this time when they clicked on end button, then end date went to the first BLANK CELL

column
AB
StartEnd
24/10/09 24/10/09
24/10/09

I would want the delete row or clear row option, which ever would work best, to happen if the user clicked on the X in top right and corner or Exited excel via File.

Ideally I would like the row cleared and not deleted, I have read Clare Watts thread and we both seems to be having a similar problem, I have used some of the examples from her thread but non seem to work. So I now wish to go with a delete or clear row option on exit, if possible.

The row changes every time. The column for deleting or clearing would be A to AB. The end date goes in to Column B

So if the user clicked on start but did not click on the Finish Button then the last row with no end date would be deleted or cleared on exit from column A to AB

column
AB
StartEnd
24/10/09 24/10/09
24/10/09(This is deleted or Cleared of exit via X top right hand corner)

View 9 Replies View Related

If Cell In Column Is Blank / Unpopulated Delete Entire Row?

Oct 16, 2013

If cells in column A3:A10000 are blank / unpopulated I would like to delete the blank rows.

View 6 Replies View Related

Find First Blank Cell In First Column Of Known Range / Select And Delete From That Point

Jun 6, 2014

I have multiple tables like the one in the picture and have to duplicate this code for different known ranges.

View 11 Replies View Related

Find The Column Name Purple & Delete The Whole Column If There Are No Blank Cells

Mar 18, 2009

I'd like a macro that does 3 things..

1. Find the last row (cell) of data in the "Customer Number" column. This search should be by the name "Customer Number" rather than by column letter because the column that "Customer Number" will be in can change.

2. Find the column named "Purple" (also by name for same reason)

3. If the "Purple" column has no blank cells in those same number of rows as the "Customer Number" column, delete the whole "Purple" column.

View 11 Replies View Related

Delete Row If Column Is Blank?

Jul 16, 2014

I've recorded and edited a macro for a worksheet I have, but there is one function I can't figure out - if it can even be done.

My sheet has 134,000 rows of data extending to column AS but, in column K, I have approximately 9 - 10,000 empty cells. I need to delete the entire row of data where there is an empty cell in column K. Can this be written into the macro?

View 6 Replies View Related

Delete Entire Row If Column C Is Blank?

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

If Column B Is Blank Delete Entire Row

Jul 23, 2007

I am using the following macro to delete "completely empty" rows. I also need to delete some rows if a cell in column B has no value. How would I change this macro?
' DeleteBlankRows

Dim r As Long
Dim C As Range
Dim Rng As Range

On Error GoTo EndMacro
Application.ScreenUpdating = False
Application.Calculation = xlCalculationManual

If Selection.Rows.Count > 1 Then
Set Rng = Selection
Else
Set Rng = ActiveSheet.UsedRange.Rows
End If
For r = Rng.Rows.Count To 1 Step -1
If Application.WorksheetFunction.CountA(Rng.Rows(r).EntireRow) = 0 Then
ActiveSheet.Rows(r).EntireRow.Delete
End If
Next r

EndMacro:

View 9 Replies View Related

VBA Code - To Delete The Blank Column

Jul 14, 2009

Example :

I want to Delete the Blank Column.

Click the image to view large

View 9 Replies View Related

Delete Rows If Corresponding Column Is Blank

Jun 15, 2007

I am trying to delete rows that do not have values in column B. This is a quote form that takes up over 1000 rows but not all are needed (ie lines that do not have any value in B "qty"). Is there a way do have excel delete these without doing it manually?

View 3 Replies View Related

Delete Rows :: Where The Corresponding Entry In Column Is Blank

Oct 7, 2008

I have data input in a particular column, say Column C.

I would like to have a macro that deletes the rows where the corresponding entry in Column C are blank.

In addition, there are multiple worksheets with the same data format in the same spreadsheet, but the number of row varies. It would be great if the macro can delete the row with blank cell in that column across all worksheet.

View 10 Replies View Related

If Column A Is Blank Delete Data From Entire Row?

Mar 20, 2014

Is there a way to delete any text or formula from an entire row, based on column A? In my spread sheet I have multiple rows where column A is blank, but column's F, G, and H have formulas in them. I would like to use VB or any other method that would be best to clear the contents of all the rows where column A is blank.

View 6 Replies View Related

Search Column A For Blank Cells And Delete Entire Row

May 20, 2009

I have tried several methods to delete the entire row if the cell in column 'A' is blank ...

View 9 Replies View Related

Delete Or Clean All Blank Column Which Is Bordered And In Fill Color

Jan 28, 2012

In my excel sheet, data present in the column are in dynamic range. After that I want to delete or clean all blank column which is bordered and in fill color. What VB program I have to write.

E.g. if data is present upto column 'J', then I have to clean all columns from 'K' onwards..(where bordered and fill color there)

View 3 Replies View Related

Select Column C And Delete Blank Entire Rows Till C300

May 4, 2014

i want to delete entire blank row from column C2:C300 i mean if i have data c2:c100 then c101:c300 delete entire blank rows

View 4 Replies View Related

First Blank Cell In Column & Offset To 1st Blank In Row

Jul 11, 2007

I have checked archives, some similiar but not quite what I want.

In code below I want the output instead of going offset one column to right in same row to go one column to right into the next blank cell.

View 9 Replies View Related

Delete Records When Cell In E Is 0 Or Blank?

Oct 31, 2008

I d like to find a method with which I can delete records from E starting from E2 that have 0 or even blanks with a macro.

View 9 Replies View Related

VBA - Delete Row Where Specific Cell Is Blank

Aug 30, 2012

I have written such loop which I want to delete entire row when a given cell is empty:

Code:
lastrow = Cells(Rows.Count, "A").End(xlUp).Row
For Counter = lastrow To 2 Step -1
If Cells(Counter, 6).Value = "" Then
Selection.Rows(Counter).EntireRow.Delete
End If
Next

It works not the way I want. It has ommited some blank rows and also removes 5th row everytime I run it.

View 3 Replies View Related

How To Delete Entire Row That Has Blank Cell

May 14, 2014

VBA codes in filtering blanks.

Here is a screenshot, and what i want to do is to delete the entire row that has a blank cell. In which here, the 5th row, 7th row and 9th row.

View 5 Replies View Related

Delete Records When A Cell In E Is 0 Or Blank

Oct 31, 2008

I d like to find a method with which I can delete records from E starting from E2 that have 0 or even blanks with a macro.

View 9 Replies View Related

Search Cell If Blank Delete Cell Shift Values Up

Oct 22, 2009

The below code is what I have and it works but what I need is for it to loop until it doesn't delete anything. How can this be done?

View 2 Replies View Related

Macro - If Cell In Column Is Blank Then Input Text Into Same Row In Another Column

Sep 19, 2008

I am looking for a Macro that will search a column for blank cells, and when one is found will add text to the same row in another column. For example: The below is a spreadsheet. I am trying to find something that will search through column "C" in this case and add text (of my choice) to Column "A" if the cell is Blank. So Since cell C1 is Blank then Type "ERROR" is cell A1.

A B C D E
1 X X X X
2 X X X X
3 X X X X X
4 X X X X
5 X X X X

View 9 Replies View Related

Formula To Find A Value In Column A Corresponding To First Blank Cell In Column B?

Aug 7, 2013

A
B

1
Name
Action

2
Joe
Created

3
Bob
Approved

4
Cindy

5
Jane

6
Dave

7

View 1 Replies View Related

Move Down Column And For Every Blank Cell Clear Contents Of Cell To The Left?

Jun 1, 2014

i need a code that moves down a column and for every empty cell in the column the cell to the left is cleared and then it moves on to the next cell down. the column is not always the same and will start from a selected cell, and the column will contain no more than 5 rows

View 3 Replies View Related

Find Last Cell In Column And Paste Formula In Next Blank Cell Then Repeat On Remaining Columns

Jan 14, 2013

I need a macro to find the last cell in the column, then copy the formula to the next blank cell. Then, it goes back to the last cell (above) and paste's values. Then, go to the next column and repeat the process. I can do this but have to call each cell separatly...however, I would like to do it in a loop to simplify things. It would be great to even be able to just set the start and ending columns. Here is my current code:

Dim rng As Range, aCell As Range
Set rng = Range("C8, D8, E8, F8, G8, H8, J8, K8, L8, M8, N8, O8, P8, Q8, R8, S8, T8, U8")
For Each aCell In rng
Selection.End(xlDown).Select
Application.CutCopyMode = False

[Code] .......

It does not go to the next column, instead it stays in the same column and repeats the process.

View 8 Replies View Related

Get Text Inside Cell Which Is To Left Of First Blank Cell Of Column?

Mar 24, 2014

I want to get the text inside the cell which is to the left of the first blank cell of a column.

I show the problema in the attach imageSin título.jpg

View 6 Replies View Related







Copyrights 2005-15 www.BigResource.com, All rights reserved