If Statements In VBA - Run Different Macro Based On What A1 Shows?
Sep 18, 2012
I have 2 option buttons linked to cell A1 and I want to run a different macro based on what A1 shows. The code I've been trying is:
Code:
If A1 = 2 Then
Application.run "ship1"
ElseIf A1 = 1 Then
Application.run "ship2"
End If
Using this runs neither of the macros though. I've tried a few different things and still no luck.
View 5 Replies
ADVERTISEMENT
Jul 22, 2014
I have a worksheet (say, Sheet1) that I am going to manually import a large data set into on a weekly basis for reporting purposes. One of the columns from this data dump will have the header "Design Id" in the first row, but it may not be in the same column every time. I am trying to figure out how to create dropdown lists on a separate worksheet (say, Sheet2) in the same workbook where the data source always looks up the column containing the header "Design Id" from Sheet1 and then returns only the unique values from that column as options in the list.
View 1 Replies
View Related
Jul 23, 2012
Macro that will delete rows in an excel table if "W2" shows up in column D. This will be multiple rows that it will need to delete.
View 7 Replies
View Related
Jun 9, 2006
I have a userform where I have 2 comboboxes. The first combobox shows the the first column (only 1 of each) and the second comboBox shows me the secondary list that correlates to the valuse in the first from column B. Now I have a text box that I am trying to get the value from column C depending on what I have in the first 2 comboboxes. What is the easiest way to do it? This is all in VB since it is a UserForm, and using Vlookup seems to be too many lines if I go that route. Is there a way to use Index and Match in VB where it would be more efficient? I attached just a sample of how the data would be layed out in the Excel sheet.
View 4 Replies
View Related
Aug 14, 2014
I am looking for a way to show the character location number of a text file, possibly in the first row or a macro that I can run at any given location that will give me the location # I am currently viewing.
Currently, when I open the file I can see the character # at the opening screen (see attached file) but they disappear when it actually converts. I would like to be able to keep the character location ruler once the file is opened in Excel so I don't have to manually count.
View 1 Replies
View Related
Dec 12, 2008
I want to return Y or N for each row where a certain word (lets say "Apple") appears anywhere in the reference cell. Therefore in the below example the first 3 rows contain apple (somewhere in that cell) so Y is returned. I can get it to work when apple isd the only thing in the cell but not if it appears with text before and/or after it.
ie:
A B
apple Y
apple orange Y
orange apple Y
pear N
grape N
View 4 Replies
View Related
Jun 9, 2013
I have a Workbook which I'm trying to apply the following VBA to (the moment Sheet11 is opened):
If Sheets("Sheet11").Range("B8:B372")=Sheets("Sheet8").Range("F1") - Dates
Sheets("Sheet8").Range("L24").Copy - Numbers
Sheets("Sheet11").Range("B8:B372").PasteSpecial PasteValues.Offset(0,1) (paste into relevant cell in Column C)
Else, 0
I would then like the relevant cell in Column D to be activated. IE: Offset(0,2) so the user can then enter their relevant data - more numbers.
View 9 Replies
View Related
Jun 9, 2014
In column A I have the debt name i.e. the company that owes us money.
In column B I state the amount owed to us
In column C the month by which the income is due. This is selected from a drop down list: M1, M2, M3 etc up to M12
In columns D through O, I have the forecast of what payments will be recieved in months 1-12
In the next cell I want to total payment that will be recieved by the due date. So, if the the cell in Coumn C says M5, then it would just add up the amount forecast in months 1-5, but if the first cell equals M2, then it would add up the forecats for M1 and M2. What formula do I put in here?
e.g. Manually enteres numbers would look like this, but I need a formula for cells in column P
A
B
C
D
E
F
G
[Code] .......
The only way I can think of doing this is with nested IFs but the limit is 7 and I need 12. I have used 12 monhts here for example. In fact on the real version I have 48 months and obviously can;t do 48 nested IFs.
View 6 Replies
View Related
Aug 12, 2008
i've got a bunch of vlookup statements in my worksheet and i now need to create if statements based on them. however, the if statements do not recognize the vlookuped values. how can i get the if statements to work based on what the cell SHOWS and not what the formula is? i realize i can copy and paste values but i would like to retain this worksheet as a template.
View 9 Replies
View Related
Oct 6, 2006
I’m trying desperately to get this if statement to work
If Workbooks("Master.xls"). Sheets("intro"). Range("A2") <> "" And _
Workbooks("Master.xls").Sheets("intro").Range("B2") = "" Then
For Each vaFileName In .FoundFiles
ProcessDataCrit1 vaFileName
Next
If Workbooks("Master.xls").Sheets("intro").Range("A2") <> "" And _
Workbooks("Master.xls").Sheets("intro").Range("B2") <> "" And _
Workbooks("Master.xls").Sheets("intro").Range("C2") = "" Then
For Each vaFileName In .FoundFiles
ProcessDataCrit2 vaFileName
Next
If Workbooks("Master.xls").Sheets("intro").Range("A2") <> "" And _
Workbooks("Master.xls").Sheets("intro").Range("B2") <> "" And _ ..................................
Basically what it should do is to start the code ProcessDataCrit1 if there is a value in A2 but not in B2 or C2, start ProcessDataCrit2 if there is a value in A2 and B2 but not in C2 and start ProcessDataCrit3 if there is a value in all three cells. The formula is working for ProcessDataCrit1 as soon as there is a value in B2 the formula is not working.
View 2 Replies
View Related
Nov 22, 2008
I have three IF statements as below. the problem is if the first statement is true I want it to skip the next two statements or the result will be changed again.
View 2 Replies
View Related
May 26, 2008
Sheet one will contain the following:
DATE A B C D E
2/22/2008TRUEFALSEFALSEFALSERon
2/23/2008FALSETRUETRUETRUEPhill
2/24/2008FALSETRUEFALSEFALSETracy
2/25/2008FALSEFALSEFALSEFALSESharon
2/26/2008TRUETRUEFALSETRUEBill
On sheet two I need to list any date that has three or more true statements with the coresponding name.
EXAMPLE:
2/23/2008Phill
2/26/2008 Bill
View 4 Replies
View Related
Sep 28, 2009
I've done a few searches and found the 2 macros I need. They are:
Private Sub Worksheet_Change(ByVal Target As Range)
If Target.Column = 4 And Target.Count = 1 Then
If InStr(1, Target.Value, "REL", vbTextCompare) Then
If IsEmpty(Target.Offset(0, -1)) Then
Target.Offset(0, -1).Value = Date
Target.Offset(0, 1).NumberFormat = "mm/dd/yyyy"
Target.EntireColumn.AutoFit
End If
End If
End If
End Sub
and
Private Sub Worksheet_Change(ByVal Target As Excel.Range)
With Target
If .Count > 1 Then Exit Sub...........................
I know very little about VBA. The first program I use to enter a static date to the cell (Column C) to the left when I type "REL" into a cell (Column D) and the second will be used to enter a static date into the cell next to the one above (Column B) when I type anything into a cell (Column E).
They both work individually but I am now trying to compile them together and get the compile error (Because they have the same worksheet_change name). I do not know how to rename or make them in the same.
View 2 Replies
View Related
May 21, 2014
Im trying to pull together a formula to achieve the below. What i have is a spreadsheet to be used by staff in different countries so im looking to make it easy to modify the categories used without the user needing to do anything complex with formulas.
The right hand side of my file (C:E) shows a code for each year we have covered a country with the year as a prefix (2014 - Blah). The left (A:B) is a summary showing the latest year we covered that country.
Current formula:
{=IF(COUNTA(C2:D2)<=0,"","✔-"&MAX(LEFT(C2:D2&"0",4)*1))}
The current formula works fine if you set the columns to where the data actually is but for ease of use i need it to look at the data in rows 1:2 and match up the Continent/Country and then MAX the dates.
View 1 Replies
View Related
Nov 28, 2009
I created the driver macro Mike2 (At first cosisting only of the first 2 lines) with keyboard shortkey +m, to run macro Mike. (In future additionals macros). Every time I run this macro it adds 2 lines to the Macro ,regardless of the End and Exit sub statements. Why?? Do not want this to happen.
View 4 Replies
View Related
Feb 9, 2008
I'm needing a macro that will allow me to get around the limits of no more than 7 IF statements and using a SUMPRODUCT formula as well. I need the total or sum of the macro/formula to be in cell "DB8".
Here's my formula: =SUMPRODUCT(IF(CP8=M11,EXACT(K7,"DI"),0)+0+SUMPRODUCT(IF(CP8=W11,EXACT(U7,"DI"),0)+0+SUMPRODUCT(IF(CP8=AG11,EXACT(AE7,"DI"),0)+0+SUMPRODUCT(IF(CP8=AQ11,EXACT(AO7,"DI"),0)+0+SUMPRODUCT(IF(CP8=BA11,EXACT(AY7,"DI"),0)+0+SUMPRODUCT(IF(CP8=BK11,EXACT(BI7,"DI"),0)+0+SUMPRODUCT(IF(CP8=BU11,EXACT(BS7,"DI"),0)+0+SUMPRODUCT(IF(CP8=CE11,EXACT(CC7,"DI"),0)+0+SUMPRODUCT(IF(CP8=CO11,EXACT(CM7,"DI")+0,0))))))))))
View 9 Replies
View Related
Dec 21, 2009
how this code can be condensed getting rid of some of the duplicate coding?
Everything is duplicate except for the For i = 1 To x part as the formula that is added is changed from sheet to sheet.
View 10 Replies
View Related
Nov 1, 2012
I tried sending this message once before but the system crapped out. At least on my end. If it was sent and this is a partial duplicate. At any rate, as most of you know when an Excel workbook has a large number of merged fields Excel sometimes changes all the cell (not just the merged cells) formats to a Date type, with the exception of those cells that are the Text data type. I found the following code on the net someplace and I can't properly cite the author, that when run resets the cell formats to the default format which is General for all those that had been changed.
Sub CleanStyles()
Dim sty As Style, wbTemp As Workbook
' First, remove all styles other than Excel's own.
' they may have arrived from pasting from other workbooks
[Code]....
This code worked for months. However, it no longer works. I opened the code in the VBA editor and stepped through it using F8. The first time I pressed F8 the first line in the code is highlighted, just like always. The next time I pressed F8 the third line of code (not counting the remarks or blank lines) is highlighted. It did not highlight the Dim statement.
I'm using Excel 2007 in XP.
View 1 Replies
View Related
Jan 8, 2014
I'm completely new with macros. I was wondering what you would need so that the information will automatically update itself onto a summary page. For example for entries on one worksheet to create a statement on another worksheet?
Example:
Asset Type
Description
Date
Amount
OA
[Code]....
The first entry doesn't have a date, because the asset type is classified as OA. (therefore an exception) Each of this information will be linked to it's own worksheet. For example, the OA entries would create their own sheet which will summed.
View 1 Replies
View Related
Oct 14, 2009
How can I combine the two below statements like these to make one "Or Statement"? Sorry...I haven't done excel and/or's in forever?
=IF(('Proj Info'!L10="main")*AND('Proj Info'!L9="CT"),"BMSVC",'Proj Info'!L9)
OR
=IF(('Proj Info'!L10="serv")*AND('Proj Info'!L9="CT"),"BMSVC",'Proj Info'!L9)
View 2 Replies
View Related
Jun 11, 2014
I need a VBA code to create a Text file which should be in the form of DML (my scenario is to get Insert Statements for the Data available in the Excel) from Excel Sheet. And this has to be done by assigning a macro to command button where by clicking on it the DML text file should be generated. Even the syntax for the scenario will do.
View 1 Replies
View Related
Jun 15, 2009
This is weird - if you delete a sheet that contained a control then
a. showing a modeless userform resluts in a userofrm that goes invisible at subroutine End
b. public variables lose their value
These things do not happen if the sheet did not contain a control. Attached is an example file - put the inputfile.xls in your default file location (or add a path in the code) then open the ProblemDemo.xls and run the main macro to see it fal - isthis another Excelbug I've found?
View 9 Replies
View Related
Dec 10, 2009
why my zero totals sometimes show as 0.00 and other times as (0.00), when they have the exact formula?
View 2 Replies
View Related
May 12, 2008
got this quite complciated formula.
any of the cells specified can be blank at start of spreadsheet
is there a way to hide the DIV/0 error from appearing
this is the formula:
=((((((SUM(C11:C14)*(100%-R2)+(SUM(ThroughputFormulas!C33:C36)*R2)*(L2/30))/1000)*N2)*3600)*P2))/(SUM(C39:C45))/1024/8
View 9 Replies
View Related
Jun 8, 2006
PRODUCT shows a value even if 0*# =IF(H15*I15=0,"",PRODUCT(H15,I15))
View 5 Replies
View Related
Mar 5, 2009
I already have a conditional format which is working OK. I would like to put a formula in the cell so it shows a % so currently it would be 100% as there is 3 cells below showing 3 greens.
Alternativily each colour is worth a value - Green = 1, Amber = 2, Red = 3. So Cell I3 would show 3.
View 2 Replies
View Related
Oct 14, 2013
I have a problem with my formula. As you can see, i want to get the CIM number of the Team Leaders (TL Name) when i change the dropdown list of the campaign. But what im getting is the repeated CIM numbers.
Here's my formula:
=IF(ISERROR(INDEX('Team Data'!$F$2:$F$5489,SMALL(IF('scorecard (OM Search)'!$C$12='Team Data'!$E$2:$E$5489,ROW('Team Data'!$E$2:$E$5489)-MIN(ROW('Team Data'!$E$2:$E$5489))+1,""),ROW(A1)))),"",INDEX('Team Data'!$F$2:$F$5489,SMALL(IF('scorecard (OM Search)'!$C$12='Team Data'!$E$2:$E$5489,ROW('Team Data'!$E$2:$E$5489)-MIN(ROW('Team Data'!$E$2:$E$5489))+1,""),ROW(A1))))
View 1 Replies
View Related
Feb 27, 2014
I want a macro to show a message with a content in the cell B3.
For EG: "Rec as of 'B3' is created"
This has to be the message and 'B3' has to be the content in the cell B3.
I tried doing it but i am unable to show the content in B3 in the message.
View 3 Replies
View Related
May 31, 2009
I'm using Excel 2007 and have created a spreadsheet for invoicing. I have created a dropdown list which then imports the address data using vlookup.
My problem is this. If there is no text in say, address field 4 the resulting field in the invoice shows as a 0 eg,
NAME
ADD1
ADD2
ADD3
0
POSTCODE
Is there a way to move the Postcode to the empty cell showing 0? and/or how do I make the cell to show blank instead of a 0.
View 6 Replies
View Related
Jun 19, 2014
I am trying to create a basic invoice spreadsheet.
On worksheet 1, I have days of the month A4 to A35. Columns B, C, D, E are headed.
Every hour of work I would enter a " 1 " in the correct cell for the day. For example, 1 hour, every segment of the day, I would enter "1" in cells Bx, Cx, Dx and Ex. This continues for the month;
On a 2nd worksheet, this is neatened up, and I have added formulas to work out the cost and type of call;
On the third worksheet, I want to display roughly the same, however when there has been no work on the day (ie the date displays "None" and the adjacent cells show: blank, blank, blank, blank, £0.00), I want it to skip the cell and display the next date which has data to show (ie a date). The data on the adjacent cells needs match with the date (in the same way as physically deleting a 'non worked' whole row).
This then on the invoice worksheet would look neat and display only the days actually worked.
What formula(s) could I use to do this.
View 1 Replies
View Related