Complex VBA / Formula To Multiply Values

Aug 9, 2012

I have a complex request which I think can be done either via vb or a macro, not sure which is best?, will try to explain:

The table shows a list of items that make up various BOM. there are quantities of each item required at the different BOM level

0 = Top level
1 = Level Below
2 = Level below that etc, etc

If the top level (0) has a quantity greater than 1 then all the items at the lower levels should be multiplied by that quantity

THEN move to the level 1's and whatever the quntity is in the level 1 field, multiple all lower levels by that number
if the quantity fields are blank, then always multipy below by 1

This needs to continue on down the chain of levels

So basically you end up with the correct quantites of each item at each BOM level.

View 9 Replies


ADVERTISEMENT

Complex Logic Formula To Delete Values

Nov 14, 2009

upon further consideration I thought that it would be best to probably do verything in two passes or maybe not see below macro to get an idea of how the end process should function

View 4 Replies View Related

Sumproduct Formula: Multiply Monthly Values With A Maximum Value In Any One Period

Jun 16, 2009

Need the formula to multiply monthly values with a maximum value in any one period? The sample file attached explains it better.

View 2 Replies View Related

Return Row Number Of Complex Matrix Values?

Oct 30, 2013

In the attached sample file, one can see the setup of my data. I'm trying to reference the row number of a certain cell in a matrix with many cells of the same value. I have different Headers of each row, which should make it possible to use INDEX, MATCH or VLOOKUP. but i don't seem to be able to get it right.

Description.I need to return the "class" och each of the capability elements, i.e. If the capability in "Soups" is marked ("X"), at class 3, i need the integer "3" to be shown here.

View 12 Replies View Related

Complex Formula

Mar 15, 2008

i have this formula that is complex ( atleast it is to me ) and i need to add more to it. Here is the formula:

=VLOOKUP(" "&LEFT($A5,FIND("[",$A5)-2),'7E'!$C$2:$D$682,2,FALSE)*0.99

What i am needing is, when it gets the price from another worksheet, if that price is below 0.04 that it makes it 0.05

View 9 Replies View Related

Complex Printing Of Values Of Unique Strings Between 2 Arrays?

Jul 11, 2014

I have the following arrays.

A1=Array("A","D","F")
A2 = Array(Array(0, 1, 4, 5), Array(2, 0, 1, 1), Array(2, 3, 11, 3))

B1=Array("D","X","F","J")
B2 = Array(Array(6, 0, 2, 1), Array(1, 1, 6, 1), Array(7, 9, 1, 0),Array(0, 3, 2, 2))

I would like to print in column A all the unique/common values between Array A1 and Array B1. The common values are A,D,F,X,J. And I'd like to print in Columns D:G the A2(i) values and print in columns I:L the values B2(i) in the corresponding row of values of arrays A1 and B1. If some string only appears in array A1 (i.e. "A"), this means that string "A" have values associated in array A2, but not in B2, then print zeros from I:L and if the string only appears in array B1 (i.e. "X" and "J"), this means that strings "X" and "J" have values associated in array B2, but don't have valus in A2, then print zeros from D:G for the same row of X and J.

View 7 Replies View Related

Complex Formula Edit

Apr 22, 2008

The formula below works apart from the first bit which i want to be if F23 says 'fail' then i want the cell to say 'no dissertation' but if f23 says pass then i want the formula past that bit to be put into action.

=IF(F23="Fail",0)*IF(COUNTIF(B22:B45,"Dissertation")=1,IF(VLOOKUP("Dissertation",B22:C45,2,0)>39,LOO KUP(F26,{0,40,50,60,70},{"No Dissertation","3rd","2:2","2:1","1st"}),"No Dissertation"),"No Dissertation")

isolation123

View 13 Replies View Related

Creating A Complex Formula With UDF?

Jul 21, 2014

I am creating a complex formula with UDF, this Hlookup is part of my complete formula. Meanwhile, I am working on this piece, not Sure what I am doing Wrong

I try to conver "MonthCurrent" Variable in a Year because the MonthCurrent is 06/01/2014, so will be Year(6/1/2014) = 2014

My Range called "DailyRates" is based per Year = 2014, 2015 ......

[Code]......

View 2 Replies View Related

Complex Average Formula.

Feb 3, 2009

The number of columns vary, but the number of rows is constant. Lets assume, max_col is the number of columns and max_row is the number of rows per report.
Then, I need the following logic as VB macro.

for row = 6
F6 = (G6*G4) + (H6*H4) + (I6*I4)+...+ ("max_col:6" * "max_col:4") / (G4+H4+I4... "max_col:4")

View 2 Replies View Related

Complex Logical/conditional Formula

Jun 12, 2006

I am working between two worksheets. In one worksheet I have a list of
account numbers. In the second worksheet I have the same account numbers in
a different order. What I am trying to do is, If the account number from
worksheet one is found in the column with the account numbers in worksheet
two, I want to display the matching title for the account number that is in
the same row but different column in worksheet two.

So essentially (if acct # from column x in wks 1= an acct in number in
column m from wks 2, display the corresponding title in the same row of the
matching acct # found in column m). Is this possible?

View 10 Replies View Related

Complex Text Formula Formatting

Sep 8, 2008

I am trying to generate a formula for formatting text that will remove all spaces, comma's etc. Examples as follows:

The Bank Job -> the _bank_job_small.gif
Picture This! -> picture_this_small.gif
War Games: The Dead Code -> war_games_the_dead_code_small.gif
Chacun son combat (Never Back Down) -> chacun_son_combat_small.gif

I've figured out a formula that works but it seems overly complex - it uses multiple SUBSTITUTE, SEARCH and REPLACE functions. Is there an easy way to remove a range of symbols i.e. ! : ( ' ?

View 9 Replies View Related

Complex Multiple Cells Comparison Formula

Jan 16, 2014

I've tried some of the basic formulas, but this is beyond me.

I have table A of 500 rows and need to compare it to table B of 2000 rows.

A
B
C
D
E

1
D6 - 1.01
Table with PC
3
Yes

2
D6 - 1.01
Bookshelf
4
No

[Code] .......

For example with these two, from the second table to the first. IF column B equal to column and the corresponding column C equal to the corresponding column C, return for example "yes". Then I need to check the same thing for the corresponding other columns, but basically everything would be tied to B and C. The problem is the second table, larger one, is basically all over the place, I could manage to do this if we would be talking equal length tables, but I do not know what formulas I could use to check further down a row once we find an equal value.

View 5 Replies View Related

Complex Array Formula - Scores And Weightings

Oct 10, 2008

I'm basically creating a scoring worksheet, where there are a list of questions. Each question has a weighting as some are more impotant than others. Each question also has a range of answeres as some may not be clear yes/no answers. Also not all questions apply to all assessments so some may be left blank.

I basically need a formula which does the following to produce a total score:

[Total awarded score] / [Total available score of questions scored]

which equals

[(score <> "" / range)*weighting] / [if score <> "" sum weightings]

I've attached an example document where I think I'm getting close, just not sure if its possible.

View 4 Replies View Related

Excel 2007 :: Complex SumIf / Sumproduct Formula?

Oct 11, 2011

I am trying to do a dynamic sumifs that allows the user to use data validation lists to select 5 items to query. This is the easy part.

The hard part is that the amounts range to sum goes across 6 weeks and I want the answer to also take account of another validation input which specifies up to what week the range should be.

I have done a simply if statement in row 8 that flags weeks relevant to input cell B6.

How do I do a formula in say cell A16 that does the sumifs and acknowledges that the user has requested a dynamic range to sum?

Sheet1ABCDEFGHIJK1RegimePost 20052TypeBudget<<<<- Dropdowns3Prod AreaLoans4ChannelRetail5Pro/ReReactive6Week18-May-1178Flags ->1110009Regime 2TypeProd AreaChannelPro/Re04-May-1111-May-1118-May-1125-May-1101-Jun-1108-Jun-1110Post 2005Budget Loans Retail Reactive 36942041320736540011Post 2005Budget Cards Retail Reactive 38423444021726636212Pre 2005Actual Mortgages Tele Proactive 35739840536923740113Pre 2005Actual Loans Direct Proactive 3213872554552254621415Answer16Excel 2007

View 3 Replies View Related

Excel 2000 - If A1 Equal Or Less Than 1000 Multiply By B1 Otherwise Multiply By C1

Oct 30, 2013

Excel (2000), what formula would I use to accomplish the following?

If A1 equal or less than 1000 value, multiply by B1, otherwise multiply by C1.

View 9 Replies View Related

Multiply All Values In Range

Nov 22, 2006

I have a question regarding a vba formula in excel. I am trying to take a whole row ( range) of data and multiply each cell within that range by -1 if a particular cell is an Asset or Liability.

Function AFTER_REFRESH(Argument As String)
AFTER_REFRESH = True
If Range("G5:H5").Item(1, 55) = "LEQ" Then
Range("G5:H5").Value = (-1) * Range("BM5:BN5")
MsgBox "Yo"
Else
End If
End Function

Would I have to use an array?

View 7 Replies View Related

How To Convert Text Into Values And Then Multiply

Sep 18, 2013

I have 2 columns - one that has numbers and the second that has text such as A, B, C, D,and E. I need to be able to convert the text into values such as 1,2,3,4,and 5 and then multiply with the first column that has value and display the resultant.

View 8 Replies View Related

Multiply Values Accross Different Rows

Nov 28, 2008

I am trying to build a formula that will give me the 'Final Qty' listed. It needs to be based on 'indentation' level, listed in the 'Belongs To:' column. Exammple: Part 130-0014-02A belongs to 130-0647-00B, which in turns belongs to 139-0086-00D, so mathematically, 4*1*10 (order qty) gives 40.

Can this be done by using some sort of combination of Sumproduct, Index, Match, Sumif formulas? ...

View 9 Replies View Related

Sum & Multiply Values Within Criteria Range

Jul 17, 2009

Please see the attached .xls.

I've tried to replicate my formula (result is in cell J5) via an array formula but keep getting stuck.

Basically there is a 2 dimensional array of weights (range1, limits)
each range in range1 and "limits" has a midpoint
a constant value (Fixed Amt) is added to each midpoint in range1
then multiplied by another constant value (Inflation Index)
The value is then capped by corresponding value in the limits range

this is repeated for all points in the 2 dimensional array (range1,limits) (essentially weighting the results)
and the sum is returned.

I've been able to get most of the way with an array formula, but end up collapsing the array when I use the min function.

View 6 Replies View Related

Add And Multiply Values Based On Date Reference

Apr 27, 2009

I'm trying to calculate Interest accrued from a specific date. The problem is payments can be interest only which when used should keep the next months interest at the same rate instead of decreasing because the principal hasn't been paid down.

Im having problems when over the course of a number of payments they are principal + Interest and Interest only which requires at times to add up the same interest amount for 2-3 months in a row, then add up a different interest rate, etc. Additionally if the reference date is say on the 15th and the interest date is the 1st then for the last month I need to calculate the interest on a daily basis based on the current interest rate for that month.

The reference cell is H5, the Date ranges are J2 - J12, and the principal fields are: K2 - K12.

In the next post I will include the Amortization schedule.

In this example the interest is accrued at the same rate months 1-7, then decreased for months 8 and 9. so the total interest accrued should be eqaual to: $7487.74 (see next post for schedule).

Microsoft Excel - ZZ_Loan.Calculator-Update.1.1.xls___Running: 12.0 : OS = (F)ile (E)dit (V)iew (I)nsert (O)ptions (T)ools (D)ata (W)indow (H)elp (A)boutH6H7H8H9H10H12H13H14=FGHIJKLM1 v 1.0 PaymentApply DatePrincipal + InterestAdditional PrincipalInterest Only2 1/1/2009 833.333 2/1/2009 833.334Quarter Close Backward 3/1/2009 833.335 Close Date9/1/2009 4/1/2009 833.336 Days of Interest0 5/1/2009 833.337 Beg Principal Balance$100,000.00 6/1/2009 833.338 Paydowns$980.41 7/1/20091,321.51 9 End Principal Balance$99,019.59 8/1/20091,321.51 10 Net Principle Due$3,562.50 9/1/2009 829.2711 Interest Due & Accrued 10/1/20091,321.51 12 Interest Earned (cummulative)$7,350.66 11/1/20091,321.51 13 Interest pymts (cummulative)$7,350.66 14 Net Interest Receivable$0.00 TEST [HtmlMaker 2.42] To see the formula in the cells just click on the cells hyperlink or click the Name boxPLEASE DO NOT QUOTE THIS TABLE IMAGE ON SAME PAGE! OTHEWISE, ERROR OF JavaScript OCCUR.

View 10 Replies View Related

Multiply 2 Values Based Upon Corresponding Column Cells

Oct 15, 2009

I'm absolutely new to Excel and I've been trying to workout a formula to to test two conditions if true and derive the data from a 3rd column. In my attached excel file there's a Grade (A) , Status (B) and Mid Point (C) Tables. I'd like it to be formulated in a sense that forexample:

IF Grade= 1 AND Status= Q4 RETURN =3750*0.25
IF Grade= 1 AND Status= Q3 RETURN =3750*0.5
IF Grade= 1 AND Status= Q3 RETURN =3750*0.75
IF Grade= 1 AND Status= whatever (I mean whatever I input in this cell then it would retrun 3750 ofcourse satisfying the condition grade= 1) RETURN =3750

IF Grade= 2 AND Status= Q4 RETURN =5500*0.25
IF Grade= 2 AND Status= Q3 RETURN =5500*0.5
IF Grade= 2 AND Status= Q2 RETURN =5500*0.75
IF Grade= 2 AND Status= whatever (I mean whatever I input in this cell then it would retrun 5500 ofcourse satisfying the condition grade= 2) RETURN =5500
................

View 7 Replies View Related

Data Validation And Multiply Values Based On Choice

Mar 11, 2014

I've got a spreadsheet and I've used data validation to look at a list on another tab.

I need to be able to multiply values out based on what i choose on the drop down menu.

I've attached a sample spreadsheet to explain : tasks.xlsx‎

View 3 Replies View Related

Multiply Column Of Values By A Random Number Within Range?

Apr 20, 2012

I have a column of values I need to multiply by a random number (percentage) within a range of numbers (15%-22%).

How can this be done?

View 1 Replies View Related

Single Cell Two Numerical Values - Multiply In Different Columns

Jun 27, 2014

I am looking for formula , single cell two numerical values , multiply in different columns

example :

Cell (A1) contain: =350,23+25,59 (two values in a single cell)

request:

in (B2) only first value so 350,23 multiply (x) by fixed number &in (C2) only second value so 25,59 multiply (x) by fixed number

View 2 Replies View Related

Multiply & Round Formula

Mar 21, 2008

I am having a calculating issue with a formula I'm trying to use.

What I am trying to do is to multiply the " sum of one cell" with "another cell" for a total.

The following are the cells and data involved.

A12 = 93 C12 = $44.76

A19 = 93 C19 = =sum(C12*0.05) D19 = =sum(A19*C19)

The formulas looked pretty straight forward. My problem is the total I got in D19 was not what I calculated on a calculator. C19 is $2.24 and the above formula gave D19's total as $208.13 but the calculator's total is $208.32.

I can't figure out what is causing the different totals. If there is another formula I should use for this.

View 5 Replies View Related

Excel 2007 :: Multiply Series Values On The Fly Before Presenting In Chart?

Jun 4, 2014

I would like to multiply a serie in 'series values' (before presenting on a chart) with a factor (in a formula like ='[1]name'!$V$2:$V$148)

in other words I would like to do something like
=('[1]name'!$V$2:$V$148)*50

but I don't seem to succeed with the correct syntax.

In Excel searching for "multiply series values" under "edit series" there is to read:

"Use this option to include additional data series on the chart or to modify the name and values of existing data series without affecting the data on the worksheet."

So what I want to do seems to be possible.

Excel 2007 version 12.0.6611.1000

I know I can create a temporary column with the multiplied values but THIS IS NOT the way I want to solve the problem.

View 6 Replies View Related

Multiply 2 Columns When Another Formula Exists To Add In?

Aug 22, 2014

So I have the first part of my equation and it works fine. The equation is in Column D.

=IF(ISERROR(FIND("Van",A7,1)),"",B7*C7+50)

What I want it to do is: Combine the above for Col D with: if the Unit Name Column (A) says anything EXCEPT Van, I want it to multiple Cost (Col B) by QTY (E) and put the total in Col D.

View 7 Replies View Related

Multiply Dependent One Cell Formula

Aug 8, 2006

All to occur in cell G2

Condition 1.
If F2 is > 0 then multiply F2 by D2.

Condition 2 in the same cell.
If the product of F2 multiplied by D2 is > E2 AND the sum of F2 and F1
multiplied by D2 is > 0, then add the product of D2 multiplied by the sum of
F1 and F2 to E2, otherwise input E2

Condition 3 in the same cell.
If the product of F2 multiplied D2 is < E2 BUT the sum of F2 and F1
multiplied by D2 is > 0, then input the product of D2 multiplied by the sum
of F1 and F2.

Condition 4 in the same cell.
If F2 < 0, and the sum of sum of F2 and F1 multiplied by D2 is < 0, then 0.

This is the best way I could think of the write out my intention. I think if
I can get the above scenario into a one cell formula that should resolve my
pain.

View 11 Replies View Related

Formula To Multiply Single Value By Array Then Sum?

Mar 29, 2013

I am looking for an excel formula that will allow me to perform the following logic: if a cell value in (M3:BA3)="D" then multiply C29 by the corresponding value in (M29:BA29), then sum all of the products.

View 2 Replies View Related

Excel 2010 :: How To Multiply GB In Formula

Aug 11, 2013

I have Excel 2010. I am creating a spreadsheet for server backups. I have always been told to take the current size of the disk and multiply it by 10% to figure out the backup size needed for the backup. I am trying to create a formula to do this. I have a server with 25GB. The formula i tried was

=a1*10%. A1 being 25gb. Excel does not like the GB in the cell also this is only giving me the difference. I need to know what size to allow for my backup on this server.

View 9 Replies View Related







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