VBA For Automatic Email Upon Cell Change Via Other Formula
Apr 22, 2014
See attached example. all details there and noted clearly.
current code:
Sub emailinstant()
Dim OutApp As Object
Dim OutMail As Object
On Error Resume Next
[Code] .......
View 6 Replies
ADVERTISEMENT
May 28, 2014
In a spreadsheet a macro calculates some percentages and populates a small table, copies the table and generates an email. The table includes conditional formatting to fill a cell in green if it is above 95%, or red if it is below 95%. The spreadsheet works fine, but with every possible solution I have tried including converting to HTML, the color cell is always red in the outlook email. I am guessing it is because in the transition to the email, the small table no longer is located in the cells that are used to do the color format.
Whats odd is when I copy and paste into outlook it works fine, but I have been unable to figure out how to paste into the body of an email using excel vba. I have read many posts from people with similar issues, most have no solution. I am currently attempting to convert the table into a gif and try inserting that into outlook. Due to the proprietary nature of the spreadsheet, I am unable by policy to publish any code.
View 4 Replies
View Related
May 14, 2014
Basically I have a spreadsheet to monitor behaviour in a high school. There is a column in the sheet with the heading 'PT Action Required?' which has a drop down menu where users can either select "Yes" or "No".
I would like the spreadsheet to automatically send me an email to inform me if a user selects "Yes".
So far I have:
[Code] ....
However, nothing happens.
View 2 Replies
View Related
Mar 22, 2012
I have a spreadsheet set up to track questions coming into a mailbox, some of which we have to refer on to other areas. What I am wanting is for an email to be sent back to the mailbox (same email address each time) when the query has been referred to another area for 14 days (chaser) and 28 days (urgent chaser).
Details
Column B = Name of person query belongs to
Column J = Query text
Column L = this should be checked to see if it = "Referred" to indicate that the query is referred to another area
Column N = Name of the area/person the query is referred to
Column AE = holds the number of days that the query has been referred for
What i would ideally like is that when AE reaches 14 an email is sent in the following format
Subject: Name of person: Query outstanding for 14 days Body: You have a query outstanding with "Column N" as follows "Column J in bold text".
And then once it reaches 28 days
Subject: Name of person: Query outstanding for 28 days Body: You have a query outstanding with "Column N" as follows "Column J in bold text".
View 1 Replies
View Related
Jan 2, 2013
I have created a user Form where a user can enter all the details like (First name, last name, Email ID etc...). the entered data is submitted on Sheet1 and it is working for me.
Now which I want is the is it possible to pick up the last email id (Column D) and send an automatic email where email will be sent the last recipient?
Actually I want is that when a user will fill up the form I want to send him/her an email.
View 8 Replies
View Related
Sep 9, 2009
I have a cell that has a formula in it- "=IF(C13="","",VLOOKUP(C13,DATA,2,)).
Right now it works fine and returns a value of either "NANN" or "HZ". Which is fine.
But, what I would like it to do is, if the result equals "NANN", I would like the result to display "BURLINGTON". Or, if the result equals "HZ", I would like the result to display "CONOCOPHILLIPS".
View 8 Replies
View Related
Nov 24, 2011
I'm in the process of trying to get a macro to run when one cell, named "ImpVersion" changes.
Here's what I've got so far.
Code:
Private Sub Worksheet_Change(ByVal Target As Range)
If Target.Address = Range("ImpVersion").Address Then
Call Implement
End If
0:
End Sub
The problem I'm having is that ImpVersion doesn't always exist, as it is only added in when it's needed. When ImpVersion doesn't exist, I get a 1004 error.
View 4 Replies
View Related
Jan 13, 2012
I have an excel file wherein there are lots of line items in sheet1. I need to send an e-mail from Excel but before that it has to be autofilter. Below is how my data looks like.
BANBill Start DateOrder No.Business Organization NameProduct TypeCCM NameE-mail Address1-1C03GH1/1/2012XXXXXXXXXXXVPLSKarthikeyan DevanDevan.Karthikeyan@xxxxxx.com1-1C03GH1/1/2012SSSXXXXXXXVPLSVignesh DD.Vignesh@xxxxxx.com1-1C03GH1/1/2012YYYYXXXXXXXVPLSKarthikeyan DevanDevan.Karthikeyan@xxxxxx.com1-1C03GH1/1/2012ZZZZZZXXXXXXXVPLSYashwanth RajRaj.Yashwanth@xxxxxx.com
Here, first the excel sheet should autofilter in E-mail address. In above example, Karthikeyan Devan e-mail address are reflecting twice but the data is different. Now i need to copy both the line and paste it in the body of the e-mail inclusive of heading and send it to that e-mail address.
Once its completed, automatically it should active another autofilter and send it to another e-mail address.
Below is how the body of e-mail should look like. (Here i am taking Karthikeyan Devan lines as example)
We are from Billing Audit Team and are trying to determine if any of these orders were triggered to Billing Early.
If there are issues with the Bill Start Dates below, please respond back with the correct Bill Start Date and we can make the necessary Billing corrections.
BANBill Start DateOrder No.Business Organization NameProduct TypeCCM NameE-mail Address1-1C03GH1/1/2012YYYYYXXXXXXXVPLSKarthikeyan DevanDevan.Karthikeyan@xxxxxx.com1-1C03GH1/1/2012YYYYYXXXXXXXVPLSKarthikeyan DevanDevan.Karthikeyan@xxxxxx.com
ALso, subject line would be: "Action required: EB". To Address would be only one person but CC would be two peope who are always would be same (XXXX.XXX.com and YYY.YYY.com). If this could be automated trust me we are backed by under huge workload
View 5 Replies
View Related
Jan 3, 2009
way to have excel shoot out email automatically? I would not know the first thing about VBA, so if it's a VBA code, please talk to me as if I were a 5 year old. I need excel to track dates in a column, and if they are within a certain time frame, i.e 3 months out from today, then excel should automatically send out a notification to the names associated with those dates informing them that they are due to complete that task before it expires. It should also inform their boss that they are due as well as myself as the tracker. Please, if you know the answer to this, word it as simple as possible.
View 9 Replies
View Related
Oct 30, 2008
I have a spreadsheet with a number of different actions with various different dates associated to them. Is it possible to create a macro that will automatically send an email to my outlook inbox (or somebody elses) when the date is due or upcoming?
Also is it possible to include different content in the email based on say the title of the action etc?
View 9 Replies
View Related
May 29, 2009
I have an excel sheet which contains user details and date of expiry of a particular service. I would like to send an email to user when the date of expiry is met.
View 14 Replies
View Related
Jul 1, 2009
I've been to Ron de Bruin's site. Very helpful; I got the code below from him which sends starts another bit of successful code - email_via_Outlook. The automatic email part works fine. But it only checks the one cell (E3). I've tried getting it to look at E2:E10 but to no avail. Someone said on another forum that the line "If Target.Cells.Count > 1 Then Exit Sub" stops it from checking a range of cells. I want it to check E2 to E10. I also tried another bit of code which read E2:E10 but emailed every time the worksheet was opened; I only want one email sent for every time a line dips below 30.
View 10 Replies
View Related
Sep 26, 2013
I work for a company that place consignment stock in hospitals. We can generate a report with short to expired products on it. I need a way to automaticly identify and send and email to the appropriate sales person to notify them that they have a product in a hospital that will expire.
View 3 Replies
View Related
Mar 14, 2011
I am wanting to send an automatic email notification to several lotus notes accounts once a specific cell in my excel spreadsheet has been entered in (It does not matter what is entered into the cell).
View 9 Replies
View Related
Aug 18, 2014
I am looking to build a macro that can automatically email a recipient upon their name being selected from a drop down list. It designed to be for a warehouse, so when new packages come in we can scan them in and have excel send an email out once our receiving team determines who it is for. With their being multiple recipients, I would like the code to have an IF type function that choosing the correct recipient. the Column titles "Recipient/Dept" is where the dropdown list is located.
It would be ideal for the code to just utilize an open Lotus Notes Session and use that to send the email.
Attached is the document with what I have thus far : Warehouse barcode test.xlsm
View 14 Replies
View Related
Aug 7, 2009
I am sending an email when the value of a cell changes, [url]
I am using the following code in my worksheet....
Private Sub Worksheet_Change(ByVal Target As Range)
Dim rng As Range
If Target.Cells.Count > 1 Then Exit Sub
On Error GoTo EndMacro
If Not Target.HasFormula Then
Set rng = Target.Dependents
If Not Intersect(Range("AE7"), rng) Is Nothing Then
If Range("AE7").Value < 20 Then EmailOut 'MyMacroName
End If
End If
What I would like to do is increase the range that this applies to.
Range from AE7 to Range Y3:AE250.
I would like to Include the Range A3:A250 in the subject/body.
So If AE7 has changed, A7 (along with some text "This cell has changed, do X Y Z") would be somewhere within the email.
View 9 Replies
View Related
Mar 6, 2007
formula that can automatically use the current month date to extract information from other cells on my spreadsheet.
For example: This formula should be located in cell C6. Cells D6, F6, H6, J6, L6, N6, P6, R6, T6, V6, X6, and Z6 (these cells correspond to the months of the year, January to December respectively) contain the values I need. The month names are labeled above in row five.
Let's say the current month is March, I need the formula in C6 to automatically know that it is the month of March and to pull the information from cell H6 (which is the March cell). Then when April comes along, it will know that it is April and to only pull the information from cell J6; and so on until the end of the year.
View 3 Replies
View Related
Jun 16, 2007
Is there any way, in which i can make my code dynamic?? For example, in a code written in VBA, there is a reference to particular sheet, say "ABC". If i change the name from "ABC" to "ABCD" from excel, the underlying code should change automatically from "ABC" to "ABCD".
I want to make my code dynamic..
View 10 Replies
View Related
Apr 9, 2013
I need the following text in cell B:7 to change depending on the date.
"SAP F&R Poland Milestones for Tuesday the 9th of March 2013"
The thing is i need the date to read the date for the previous day? The reason being is that im reporting on the milestones for the previous day.
I guess im looking for a way to have the "Tuesday", "9th", "March" and "2013" to change automatically?
View 2 Replies
View Related
Feb 14, 2014
i am trying to make one cell automatically change to current date and time when the cell next to it has changed value. ive search other posts but cannot figure this out. so if cell A1 changes value cell B1 should automatically fill with current date and time cell A1 changed value.
View 9 Replies
View Related
Dec 12, 2011
I have several data validation style drop down menus, and I basically don't want excel to recognize changes in these cells and execute a calculation of the entire workbook. Since there is a large number of calculations being performed in the workbook the sheet gets really slow.
Overall the way excel "automatically calculates" really screws me up a lot. This built in functionality could be a lot smarter in my opinion.
View 3 Replies
View Related
Mar 29, 2014
At work I have a register/log. Its just a printout of a standard format in excel sheet. I print a month of sheets at a time and write the day and date on it by hand at the top. Is there some formula in excel by which it prints the dates as well in a progressive manner. Eg. If today is 29th May 2014 and today I print 30 copies of the register/log. The first copy has todays date on it and the the next one had tomorrows date....and the 30th copy automatically has the end of April 2014 printed on it.
I've found this code but cannot get it to work.
My workbook is called Shift Log, the worksheet is called v2 and I'm using Excel from MS Office Professional Plus 2010 (32bit)
#Private Sub Workbook_SheetBeforeDoubleClick(ByVal Sh As Object, _
ByVal Target As Range, Cancel As Boolean)
Dim sDate, i
retryDate:
sDate = InputBox("Enter the starting date, or click 'OK'" & _
" for the current date", "Start Date")
[Code] .........
View 3 Replies
View Related
Mar 18, 2009
I want to create an automatic page break at each value change in Column A, and also a page footer that "restarts" at each change in the same column.
For example, I would like a "Page x of y" footer, but I don't want "Page 1 of 3,500", I want "Page 1 of 3", etc...every time that Column A value changes.
View 9 Replies
View Related
Mar 31, 2007
I'm using excel 2000 and I just noticed something and am unsure how to change. I guess early on my building of a workbook I accidentally left calculation to manual. I would like to change calculations to automatic on permanent basis. I keep changing it and it changes back to manual after I close then reopen the workbook. I would prefer to change permanently to automatic....Any ideas would be a bonus. On all new workbooks I can save in automatic but I cannot change from manual to automatic.
View 4 Replies
View Related
Mar 7, 2014
I am looking for a vba where by the default colour of the font for new text typed in any cell of a workbook change to green or red and the default black automatic becomes secondary. The existing text in the workbook in its existing font colour must not change i.e stays in black or red.
View 1 Replies
View Related
Mar 25, 2013
I have below formula.i need to change the cell address AK in the below formula on the value change in the A3.
=SUMIF(Working!$D$6:$D$3000,Report!B3,Working!$AK$6:$AK$3000)
For example if A3 is having value AZ i need the formula changed automatically as below
=SUMIF(Working!$D$6:$D$3000,Report!B3,Working!$AZ$6:$AZ$3000)
View 4 Replies
View Related
Oct 18, 2006
I need to email a page from a worksheet to a series of people and am currently using the following
Worksheets("Report").Activate
ActiveWorkbook.Save
Dim wb As Workbook
Dim strdate As String
strdate = Format(Now, "dd-mm-yy h-mm-ss")
Application. ScreenUpdating = False
ActiveSheet.Copy
Set wb = ActiveWorkbook
With wb
however, I also need the worksheet to be email to the person currently running the macro (i.e. when they email it to the others, a copy is sent to thier own inbox too), is there any way in which this can be done?
The user's email address could be formed from data in the spreadsheet, if there is an easier way to do this (i.e. email address is based on a cell in the spreadsheet).
View 3 Replies
View Related
Jan 27, 2007
I want to edit a cell's value without changing the formula the cell contains.
View 10 Replies
View Related
Nov 22, 2013
I have this code as seen below that sends an email.
I would like to change the font size of - mymail.body=
How can I modify this existing code to achieve that.
Code:
Set myOlApp = CreateObject("Outlook.Application")
Set mymail = myOlApp.CreateItem(olMailItem)
mymail.Subject = strSubject
mymail.Body = "WHAT DO YOU PUT INTO A BOX ?"
mymail.Display
mymail.ReadReceiptRequested = False
mymail.attachments.Add "P:SR.xls"
mymail.to = "email@email.com"
mymail.Send
View 4 Replies
View Related
Oct 16, 2007
Private Sub Worksheet_Change(ByVal Target As Range)
Application.EnableEvents = False
If Target.Count > 1 Then Exit Sub
If Target.Column = 1 Then
If Target = "" Then
Cells(Target.Row, 3).ClearContents
Else: If Target.Value = "test" Then Cells(Target.Row, 3) = my.Email.co.uk
End If
End If
Application.EnableEvents = True
End Sub
Basically, my target column is column A, i have 200 employee numbers, now we have to find the email addresses manually which is useless so i want to spend the time writing some code like:
If the target column is 123456 then the offset column D is email address
If the target column is 654321 then the offset column D value is email address.
I have 200 statements like this ill need to add unless anyone has any suggestions, perhaps select case structure?? I dont really know where to start an so i await your replies.
View 9 Replies
View Related