VBA Column Increment Loop?
Apr 15, 2013
I have a number of strings in adjacent columns in the same row, like so.
Coulmn1 Column2 "blank" Column3
If the cell is blank I want to hide the respective column .
I'm guessing the code will roughly take the form of the code below with an if statement nested in a for statement.
Sub (test)
With Range("BD22")
For i = 1 To 10
if range (i,22) = "" then hide
else don't hide
.Offset(1, 0).Formula
Next i
End With
View 1 Replies
ADVERTISEMENT
May 22, 2014
I'm trying to use the following loop to increment the column width of a range of columns thus:
Code:
NewWidth = 0
WidthIncrement = 0.5
For MyCount = 1 To 26
NewWidth = NewWidth + WidthIncrement
Cells(1, MyCount).EntireColumn.ColumnWidth = NewWidth
Next
If I set WidthIncrement to be an integer value, the code works correctly. If, however, I make it something like 0.1, all the column widths that the loop acts on are set to 0. I suspect it's something to do with how I'm declaring the NewWidth and WidthIncrement variables - they're currently set to Double. I know that I can have decimal values for column widths (e.g. 8.43)
View 5 Replies
View Related
Feb 7, 2008
I have some numbers in a column that I need to copy 12 times (each one) into another column. The problem is that I got like 200 records that will be converted in 15000 aprox. I've uploaded an example of what I need,
View 3 Replies
View Related
Feb 24, 2009
For Next Loop increment. simple For-Next Loop:
View 2 Replies
View Related
May 31, 2007
I want to test a condition and if false skip the rest of my for block and hit the next for:
For something = 1 to 100
if test = "false" ?NEXT FOR?
code
code
code
code
Next
I can set a lable at the Next and use a goto but that seems kinda kludgy.
View 10 Replies
View Related
Jan 9, 2012
What would be a good way to increment each of my ranges for example I need x to copy Range B11:to G20 and paste it to C10 for the second loop. Each Variable has different increments.
I'm horrible with Visual Basic.
Sub Macro5()
'
' Macro5 Macro
'
Dim i As Range, j As Range, k As Range
Dim x As Range, y As Range
Dim Num As Integer
[Code]....
View 1 Replies
View Related
Sep 11, 2007
I am experimenting one way to solve one problem, but to do this I have to Name some cells with some values, thing that normaly in VBA is symple but I have never done before in coding. May be my problem is because what I am doing is not valid with the vlookup but if you can take a look to my file. The problem is that when I run the Macros the Named Cells are totaly out of place...
Sub Lookup()
dercell_unit = Range("C65500").End(xlUp).Row
Range("B" & dercell_unit, "E2").Select
Set Rango = Range("B" & dercell_unit, "E2")
For i = 2 To dercell_unit
Names.Add "VALrsa", "=$C" & i
Names.Add "RESOLdds", "=$D" & i
Cells(i, 7) = Application.VLookup(Cells(i, 2), Rango, 4, False)
Next i
End Sub
View 3 Replies
View Related
Jan 10, 2007
I am using this code to create onsheet user form and populate a spreadsheet db
'Step 1 : store the information in every second row in DBsheet
Set rngDataOut = Worksheets("Database"). Range("A65536").End(xlUp).Offset(2, 0)
'Step 2 : Post the current results
rngDataOut.Range("A1") = Now()
rngDataOut.Range("B1") = Range("B1")
rngDataOut.Range("C1") = Range("B2")
rngDataOut.Range("D1") = Range("B3")
rngDataOut.Range("E1") = Range("B4")
'Step 3 : Clear current Selection
Range("B1") = ""
Range("B2") = ""
Range("B3") = ""
Range("B4") = ""
my question is how could I modify it with for-next loop because the form will be with more than 50 entries.
View 2 Replies
View Related
Oct 11, 2007
I try to select a range with a counter, but cannot find how to do it.
My aim is in the following loop to select the range ("B,i:V,i").
B and V are the colum, i is the counter that marks the row number, counting from 8 to 16.
Sub Copy()
For i = 8 To 16
Sheets("DB2").Select
If Cells(i, 7).Value <> 0 Then
Sheets("DB3").Select
i = i - 1
Cells(i, 2).Select
'this is the cell that should be a range ("B8:V8") to ("B16:V16"), as the counter goes from 8 to 16
i = i + 1
Selection.Copy
Cells(i, 2).Select
ActiveSheet.Paste
Application.CutCopyMode = False
Else
End If
Next i
End Sub
the Sub works with a cell, can somebody please tell me how to turn the cell in the range?
View 9 Replies
View Related
Oct 11, 2011
Make a loop where I can increment the row number and execute the command where I set the formula?
View 1 Replies
View Related
Jun 28, 2009
Here is what I try to do:
At
A1 = Power(C1,B1)
A2 = Power(C2, B1)
A3 = Power(C3, B1)
....
An = Power(Cn, B1)
How can I increment column C while keeping B constant at B1 by using right-bottom mouse pointer dragging on column A? Or is there another way?
View 2 Replies
View Related
Jun 14, 2013
I have a workbook that has a few data sheets and a summary sheet. On this summary sheet I have to grab data from the data sheets which is in the same row number but different column (always 5 to the right of the previous one).
Eg: Person's Name is in Row 10, Col E (E10), the next name is in J10, then O10, etc. This carries on past Column Z. For each person there is a bunch of other data which is in the same format (set row but 5 over for column).
Since row stays the same i thought i could absolute reference that and then leave column as relative and drag down. This works but only if I drag to the right (across columns) and only if i need to increment by 1.
View 2 Replies
View Related
Jan 24, 2009
I have a worksheet (Sheet1) with column A labeled MissionNumber. I have also created a Form which I can use to enter the next mission number into that column. However, instead of manually entering the number...when opening the form I would like it to check column A for the last entry...and automatically increment the mission number by 1 and have it displayed on the form.
View 10 Replies
View Related
Jun 21, 2014
Have table with five columns and five rows. The columns(C4:H4) hold Systems, Systems is a defined range, and rows (B5:B9) hold staffer names, Staffer is a defined range. Cell A5 holds period, by quarters, ie, Q1-Q4.
At present am using =COUNTIFS(Staffer,$B$5,System,C4,Q,$A$5). This works fine but as you can see I must change the Staffer starting reference $B$5, with each new row.
formula that changes column and row automatically as I drag down and across.
View 6 Replies
View Related
Jan 17, 2008
I'm using a macro to update individual formulas in a sheet that contains data from external documents. (i.e. ='C:September[Book2.xls]Sheet1'!$AZ$1 + 'C:September[Book3.xls]Sheet1'!$BA$1 ) Every quarter I have to change the column references in this formula (i.e. $AZ$ will become $BD$ and $BA$ will become $BE$ and so on). Also I have to change the September reference to December etc (but I've mastered this already). My current code works well, but requires manual updating:
Dim ColumnReference1
ColumnReference1 = "BD"
Dim ColumnReference2
ColumnReference2 = "BE"
Worksheets("Sheet1").Range("H48").Formula = "='C:September[Book2.xls]Sheet1'!$" & ColumnReference1 & "$1 + 'C:September[Book3.xls]Sheet1'!$" & ColumnReference2 & "$1"
My problem with this method is that I need to automate the updating of ColumnReference1 = "BD" to ColumnReference1 = "BH" to ColumnReference1 = "BL" and so on and so forth. It's handy that the reference shifts across 5 columns, which remains constant. Ideally, I'd like to tell the macro to look at "AZ" then add 5 columns.
View 9 Replies
View Related
Jan 18, 2008
I'm trying to write a formula that will keep the Column ID static while allowing the Row ID to be reference. Each week my worksheet adds one line and the formula in question is moved one cell to the right and thus the formula cell makes the same move (1, -1). I need the formula to keep the column the same from week to week, while allowing the row to shift downward with the formula. I've attached a sample spreadsheet with the formula I derived. Check out the highlighted formula to familiarize yourself before running.
View 2 Replies
View Related
Mar 7, 2014
I am working on a sheet that has dynamic data saved. For any new value, a new row is inserted. I want to add a counter or more like an index so that I can see the number of the rows. I know that excel has is on the side but, I want to be able to make calculations. Like average of the numbers. Lets say I have 512 rows added. I want to be able (automatically via vba) to set the average with a sum of the values/ 512 which will be the number of the code I am asking. So I want a code that will start with the number 1 at (lets say) cell B2 and it will go like B3=2, B4=3.... any time a new row with data is added.
View 9 Replies
View Related
Apr 27, 2014
I am creating a training document for work; the sheet I'm creating is a summary sheet which works out how many people answered questions correctly, incorrectly (bringing in from another sheet), number of questions answered and percentage of correct answers.
Looks like:
Correct: =COUNTIF(sheet1!E2:E36,"correct")
Incorrect: =COUNTIF(sheet1!E2:E36,"incorrect")
Number of questions answered: =SUM(C4+C5) (correct+incorrect)
Percentage right: =SUM(C4/C6) (correct/number answered)
I need to drag these 4 formulas down into another 400+rows, however in the correct and incorrect formulas I need it to keep the 2:36 but change the e to f, g, h, etc.
View 14 Replies
View Related
Oct 29, 2009
I have the following formula. How can I change it so thst when copy/drag the column number automatically increments by 1
IF(ISNA(VLOOKUP($A2,'Purchase Order Pivot Table'!$5:$500,67,FALSE)),0,VLOOKUP($A2,'Purchase Order Pivot Table'!$5:$500,67,FALSE))
View 7 Replies
View Related
Dec 3, 2007
COPYING indirect formula. When I copy, the lookup reference does not change. My formula is =INDIRECT("'"&$A247&"'!j106"). When I copy horizontally across cells, I want J106 to increase, ie j107, j108 etc. At the moment it remains at J106 and i have to manually increase the numbers by 1.
How do I change my formula so that the numbers increase automatically?
View 6 Replies
View Related
Jul 10, 2013
In Column A, each cell up to A2197 has had data manually entered. A2194 has data AD453302085PIND, A2195 has data AD453302086PIND, A2196 has data AD453302087PIND.
Following on from A2197, I need to increment each cell by one number. I have modified the following solutions which were provided yesterday ="AD"&RIGHT(LEFT(A2196,5),3)+1&"PIND" and
=LEFT(A2196,2)&123+ROW(A2196)&RIGHT(A2196,3).
View 6 Replies
View Related
Jun 6, 2014
In my spreadsheet, each row of data in Column B starts with 3 numerics (e.g. 001) followed by some text. For example:
Cell B2 contains '001 - Text for this cell'
Cell B3 contains '002 - Different Text for this cell',
Cell B4 contains '003 - Different Text for this cell', etc.
I have hundreds of rows which follow this format.
I have had to insert several rows in my spreadsheet in between existing rows which has thrown off the numbering in the first three positions of my Column B cells.
Is there any way to update the data in Column B so the text data in each cell is retained but the first 3 numeric values are updated and again sequential?
View 3 Replies
View Related
Mar 21, 2008
I have a formula that I want to insert using a macro, so how do I iterate the * values in this line?
ActiveCell.FormulaR1C1 = "='Sheet1'!R[*]C[*]"
View 9 Replies
View Related
Feb 21, 2014
I have a code that inserts a new column after every 7th column. I want to include a formula where every 7th column value is subtracted from the values present in the column before the 1st, or you can think of it as subtracting 7th column of the present group from the 7th column of the previous group. Example: The range of my data starts from col F, then
F (7th) New Column (G) H (1st) I (2nd) J (3rd) K (4th) L (5th) M (6th) N (7th) New Column (O) P (1st) Q (2nd) R (3rd)
So, New Column (O) = N - F
and the next New Column (W) = V-N ...
NOTE: Column G can be ignored.
I want to add a looping function to this so that it will continue to subtract for the other respective columns as well. How do I incorporate this into the following code?
[Code].....
I'm using Excel 2013.
View 2 Replies
View Related
Dec 6, 2006
on the syntax of things in VBA. here's a description of what i'm trying to do:
1) loop through a particular column ("N"), and compare the values (if not blank) with corresponding cells in another column ("V"). i.e. - comparing N1 to V1, N2 to V2, etc...
2) run If, ElseIf statements to display appropriate values in different column ("O"), but on the row that corresponds to the row the values in Step 1 are compared. i.e. - if N1 > V1 then cell O1 = value; if N2 > V2 then cell O2 = value; etc...
here's an example (but obviously not in proper syntax). hopefully someone can help me convert it to Excel VBA:
Function CalculateFR()
Dim Col1 As Column = ColumnN
Dim Col2 As Column = ColumnV
Dim Col3 As Column = ColumnO
Dim Cell As Cell
Dim IndexValue As Integer
For Each Cell In Col1
If Col1 > Col 2 Then
IndexValue = 5
Else If Col1 < Col2 Then
IndexValue = 4
End If
Next Cell
If Not IsEmpty(Cell) Then Col3 = IndexValue
End Sub
View 7 Replies
View Related
Sep 27, 2007
I had a problem finding something then deleting the column, I tried to alter the code from that thread to solve a new problem and I am close (I think), but not quite there. I need to find the column "Group" and merge it with the column "Sex" which is offset by 1 column. This code will go through and find the column "Group" and merge for the first cell, but will then get stuck in a loop just concatenating "Sex" to the end continuously. I need it to concatenate both columns entirely together. Any simple fix to what I modified? Previous thread should you be interested:Find Part Text On All Sheets & Delete The Column.
View 9 Replies
View Related
May 21, 2009
Increment all cells located in Column H up by one (the one above it) cell Except for the header cell (since its the header)(H1),
H2 will always be a blank due to the make up of my database so that will not cause the header to be re-written.
Column H is not an entirely filled column and some cells are empty (if this info was needed in optimizing the code),
Im seeking the quickest and easiest way of implementing this since the database is very large.
View 2 Replies
View Related
Dec 7, 2009
I have a worksheet and it has some information on it (ill show an example in a min). will all the information i need is in one column. there is only the name of the item that i need the rest can be deleted. like so ........
View 12 Replies
View Related
Sep 29, 2008
I am trying to loop through columns and rows to get the sum of each and delete that column that equals zero. I have-
Dim lastrow
Dim r, c As Integer
Dim RowSum
RowSum = 0
ActiveSheet.UsedRange.Select
lastrow = Selection.Rows.Count
For r = 2 To 80
For c = 2 To lastrow
RowSum = RowSum + ActiveSheet.Cells(r, c).Value ' here I get error Application-defined or object-defined error
Next c
If RowSum = 0 Then
ActiveSheet.Cells(r, c).EntireColumn.Delete
End If
Next r
What am I doing wrong?
View 9 Replies
View Related
Nov 2, 2009
The below code is supposed to loop through column a and create a copy of a worksheet change the name of the worksheet to the value found in column A
I need change the loop so it starts at A8 and Ends at A59. I have no Idea how to do this.
Sub AddSheets_FromList()
Application.ScreenUpdating = False
'assumes starting macro on first value in date list
Dim ListCount As Integer
Dim NewSheet As String, LastSheet As String
LastSheet = "Weekly Results"
ListCount = 0
View 9 Replies
View Related