
Originally Posted by
Phantom645
I'm a newbie so please be gentle! {snip} I am trying to learn VBA over the internet with limited success.
Great, and welcome! Ask away, and we'll see if we can't help you learn this stuff. 
I've added one more condition to this. Depending on how many you have, we may want to look for a different way though... Be careful that you don't have any ranges that overlap with one you've already provided, or you may find something getting overwritten...
Code:
Private Sub Worksheet_Change(ByVal Target As Range)
Dim rCell As Excel.Range
If Not Intersect(Target, Range("L7:L10")) Is Nothing Then
On Error GoTo oops
Application.EnableEvents = False
For Each rCell In Intersect(Target, Range("L7:L10")).Cells
If Len(rCell.Value2) > 0 Then
rCell.Value2 = Application.WorksheetFunction.Round(rCell.Value2 / Range("E7").Value2, 0) * Range("E7").Value2
End If
Next rCell
End If
If Not Intersect(Target, Range("L12:AO12")) Is Nothing Then
On Error GoTo oops
Application.EnableEvents = False
For Each rCell In Intersect(Target, Range("L12:AO12")).Cells
If Len(rCell.Value2) > 0 Then
rCell.Value2 = Application.WorksheetFunction.Round(rCell.Value2 / Range("E12").Value2, 0) * Range("E12").Value2
End If
Next rCell
End If
'Add more here...
leave:
Application.EnableEvents = True
Exit Sub
oops:
MsgBox Err.Description
Resume leave
End Sub
Let us know if you need any more help with this.
Bookmarks