Modules & VBA :: Scheduled Task - Run Macro To Send Report Out?
			Feb 3, 2014
				I have a report that I run manually from my computer every day.
This report is created by a macro in microsoft access, then it runs a VBA macro to send it out..
Is there a way that I can add this as a scheduled task since I usually forget to send it out? 
	
	View Replies
  
    
		
ADVERTISEMENT
    	
    	Aug 25, 2012
        
        I have a MS Access append query that updates a table from a linked Excel spreadsheet. Im trying to automate the running of the query during the night. 
Ive tried a couple of ways to schedule the task with Windows Task Scheduler, although each time, it appears to start the job, but then just hang (task never completes, doesnt run the query or macro and when I log back into Windows, the msaccess.exe process is running).
Methods Ive used are:
- command line with /x macroname
- vbs script which runs the query / macro
Code:
'Read from a Microsoft ACCESS database
Option Explicit
dim oaccess
'execute another Access macro
set oaccess = createobject("access.application")
oaccess.opencurrentdatabase "H:Database.mdb"
oaccess.docmd.setwarnings false
oaccess.DoCmd.RunMacro "Macro1"
oaccess.docmd.setwarnings true
oaccess.closecurrentdatabase
oaccess.quit
set oaccess=nothing
WScript.Quit(0)
- .bat file which just has the command line in it.They all run fine when I am logged in, although it seems to hang when I am logged off the network. I have the correct permissions as Ive scheduled a Excel macro to run and its fine. 
	View 4 Replies
    View Related
  
    
	
    	
    	Apr 20, 2015
        
        I have a vbs-script that opens my access database db.mdb and runs the module "Export":
 
dim accessApp
set accessApp = createObject("Access.Application")
accessApp.OpenCurrentDataBase("D:Datadb.mdb")
accessApp.Run "Export"
 
accessApp.Quit
set accessApp = nothing
 
This works fine as a scheduled task on a Windows 7 computer.
 
Is there a way to make this work on a Windows Server 2008 R2 ? When I double click the vbs-file, the file opens instead of runs. And when I create a scheduled task, nothings happens.
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 23, 2007
        
        Hi All,
Does anyone one if it is possible to program a schedule for "Windows Scheduled Task" via VBA?
Reason:- A multi user application is set to give a 5 Min warning at the same time every day. After the 5min the users are politely kicked off. 
At that time the Windows Scheduled task opens up the BE (only on 1 PC the fastest). The BE start form has a time event that backs up the BE and compacts and repairs itself then closes the application.
Not pretty I know but it works really well.
This shutdown time can be set/changed on the FE however, when it is the windows Scheduled Task has to also be changed which I would like to do automatically via VBA
Any help would be appreciated.
	View 1 Replies
    View Related
  
    
	
    	
    	May 18, 2015
        
        We have small data dumps from a webservice delivered to us daily in csv format. I'd like to create a system where we can have the data automatically imported into either Access.
My idea is this: 
1. CSV is downloaded to <x> folder.
2. Scheduled Task runs script to look in folder <x>
3. If CSV is found in folder <x>, import it's data into a fixed Access db->table.
4. Move CSV to an archive folder to avoid re-processing.
Is this feasible?  How complicated would it be, and how to get it on track?
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 2, 2013
        
        I am trying to send tasks to other people using access vba. I had used before in my database but was using early binding and now through version issues of office I am trying to recreate the code using late binding, however I am getting various problems with certain lines of code.
Primarily .datedue line I am getting run time error 438 object does not support
 
Below is my code:
 
Public Sub ASB5PostponedTask()
Dim olApp As Object
Dim olTask As Object
Dim olDateEnd As Date
Dim ToContact As Object
Dim olTaskOwner As String
olTaskOwner = "e.grainger"
[Code] .....
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 26, 2013
        
        I want to sent out my report as a pdf file with my macro.. I've been trying to use the VBA
Code:
Option Compare Database
Sub Fix1()
DoCmd.SendObject acSendReport, "MarketRiskControl_HighestDiffs_AsOfCurrentDate", "PDFFormat(*.pdf)", "my mail@mail", "cc", , "SD Counterparty Report as of Current Date", "Regards, Trading Risk Control", False
End Sub
But this doesn't work, get run-time error 2282..
I am using access 02.
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 19, 2014
        
        Just got a new Windows 7 computer and installed Office 2013.  I have a report that saves itself as a pdf in a temp folder and then attaches the pdf to an email and sends it out. I use a macro to run the report and everything works fine from there.  I have a VBS file that runs the macro and clicking the vbs file makes everything work fine. the code is below.
When I tried to run it though the task scheduler it show as completing fine,  but it doesn't. So I added a reference the vbs in a batch file (below) and output the logs to a temp file. After I ran the batch and opened the log I seen the message 
Wed 03/19/2014 14:11:17.74 Username 
C:Users*****DesktopAuto Reportsaragingrecent.vbs(1, 1) Microsoft VBScript runtime error: Permission denied: 'CreateObject'
Wed 03/19/2014 14:11:17.77
I turned UAC all the way down. turn off the virus scanner, and have local and domain admin access.  I'm at bit a lose here.  I had this working before but can't seem to remember how I did it.  This is just one example I have several other reports that were schedule to run overnight, but they basically all use the same code and processes.  
Code:
'launch macro
set accessApp = CreateObject("Access.Application")
accessApp.OpenCurrentDatabase "C:Users******DesktopAuto ReportsAgedTrialBalance.mdb"
accessApp.DoCmd.RunMacro "MCRecent"  
[Code] ....
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 30, 2013
        
        I want to automate a task in access....
I have a query that may have 6 - 7 different records for example each record contains a different email address, i need to get the first email then send and email to that address then go to the next record get that email address send an email to that email address until its gone through all the records...
I use this code to send an email, dont know how to loop through records and get the email...
Code:
Dim appOutLook As Outlook.Application
   Dim MailOutLook As Outlook.MailItem
   Dim strPath As String
   Dim strFileName As String
   Set appOutLook = CreateObject("Outlook.Application")
[Code] .....
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 17, 2013
        
        I use this to send email msgs through gmail, found it on the net somewhere, adapted a bit and it works. 
Code:
Private Function fSendGmail() As Boolean 'Returns True if No Errors are Generated
On Error GoTo Err_ErrorHandler
fSendGmail = True
Const conStrPrefix As String = "http://schemas.microsoft.com/cdo/configuration/"
Const conCdoSendUsingPort As Integer = 2
[Code] ....
Err_ErrorHandler:
    If Err.Number <> 0 Then fSendGmail = False etc, etc
End Function      'fSendGmail
I'd like to send report attached to this as pdf or rtf. How should I go about it. I know how to create pdf and save it.(DoCmd.OutputTo acOutputReport, "My Report", acFormatPDF, strPath, True) But where do I attach that here? Is it necessary to save the file first?
	View 6 Replies
    View Related
  
    
	
    	
    	Jan 8, 2015
        
        I use a macro that attaches  a document automatically to an e-mail  address ready to send this report is governed by a query  of which the criteria is " loss order number " this is in a pdf format of which I need if possible
  
The problem I have is the same pdf file keeps attaching itself to the e-mail no matter which loss order number I select. The reason I think is because the report is called NCR so it is not changing from the previous one. What I think can solve it but not sure and don't know how to do  is get the " loss order number " within the report name.
If I just send the report to a file direct it does work as I am prompted for a file name  
  
Can the loss order number get into the file name within a macro/vba
Code:
 Name="EMailDatabaseObject
 Name="ObjectType">Report
 Name="ObjectName">SEND NCR
 Name="OutputFormat">PDF Format (*.pdf
 Name="To">=[E-mail Address] & IIf(Nz([E-mail Address
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 5, 2015
        
        I would like to put 3 more people on as a CC but don't send the report 
Code:
 Dim strTo As String
    Dim strSubject As String
    Dim strMessageText As String
        Me.Dirty = False
        strTo = Me.E_Mail_address
[Code] .....
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 30, 2014
        
        I have a VBA module in my Access 2010 database that will send a report as a PDF via email to a predetermined email address. the only problem using the docmd.sendobject method is i keep getting a pop up that says "A program is trying to send an e-mail on your behalf. If this is unexpected, click Deny and verify your antivirus software is up-to-date." 
 
I have a windows task set up at the same time each day to open this database which runs an autoexec that creates this report and using my VBA module sends the email. i want it to just send the email without any imput from me. I want automation. 
 
Here is my code that i am using to create and send the email
 
"Private Sub Report_Activate()
filename = "Name of file" & Format(Me.Date_time_returned "MMDDYY") & ".pdf"
DoCmd.SetWarnings False
DoCmd.SendObject acSendReport, "Name of file", acFormatPDF, "the destination email address goes here",,, "Request completed and sent " & Format(Me.Date_time_returned, "MMDDYY"), "Subject of email goes here", False
DoCmd.SetWarnings True
End Sub"
	View 4 Replies
    View Related
  
    
	
    	
    	May 19, 2014
        
        Can you send a report directly to the printer? We have Clients with multiple Contact Notes, by multiple Clinicians, each of these are separate tables. Every month we print two reports for each client that had at least one contact in that date-range. Usually 200 clients, takes a lot of time. My approach so far is a query within a make-table query to get a list of unique client ID's that had one contact in the date-range. Then I use that table in code to create a recordset, use a Do Loop within that where I print the two reports for the 1st client, move to next record and loop. Now that I've got it working I'm not sure how to print all the reports My 1st question, can you send a report directly to the printer from code? The printer is a networked Konica Minolta Biz-hub so I think it can handle that many jobs being queued that fast.
	View 4 Replies
    View Related
  
    
	
    	
    	Nov 4, 2013
        
        I am using Access 2007 and are a newbie.
I am using the following code (Sendobject) to create a PDF of a report and send it via email to a customer's email address.
Private Sub EmailWorkOrderQuote_Click()
On Error GoTo Err_EmailWorkOrderQuote_Click
    Dim stDocName As String
    Dim mFilename As String
    Dim mEmailAddress As String
[Code] ....
It works fine except that the I want to to able to utilize the ability to send the email with either both the CC and BCC or either or neither as well.
I have a table called "My Company Information" that contains the email addresses for the CC and BCC. If I have values in these fields, everything works great! If I have no values in either of these fields, I get "Invalid use of Null"....
I want to be able to use either both CC and BCC, either CC or BCC, or neither used and it still work.
	View 9 Replies
    View Related
  
    
	
    	
    	Feb 13, 2015
        
        Actually I need to select printer before printing report. That's why I need to call  printer dialog to select printer using "PrintObject" in macro. But it's print the form not report. I need to print a specific report. 
	View 1 Replies
    View Related
  
    
	
    	
    	Dec 23, 2005
        
        Hoping someone can help - need to know if there is a way to use a Outlook message other than the blank one that is used with the send object macro.  
Maybe a normal message with a signature, template or something - when the macro is run, no formatting is included with the e-mail message, and the body of the message is limited to 255 charaacters.  
Would like to use a customized message, and I need the send object macro to place the object in that message format.
If anyone can help, I would greatly appreciate it...thanks.
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 5, 2013
        
        I have been searching the web for a solution to this problem.  I have created a scheduled task on Windows 7 to automatically run a macro from a command line, however, it seems to only run when the user is logged onto the machine.  Is there a way to run Access without the interactive logon?  I would rather not leave the machine logged in with this account, but if that is the only solution, so be it.
	View 7 Replies
    View Related
  
    
	
    	
    	Mar 4, 2015
        
        I am making a calendar form in Access and want it to look like Google Calendar as much as possible.  I am wondering if there is a good way to go about setting up the form to allow for multiple appointments scheduled for the same time.  Designing the form to be in Week View with half hour blocks has me at 210 text boxes.  As far as I can tell, there isn't a way to dynamically add in controls unless you are in design view.  However, how many appointments might be scheduled at the same time.  I could add in as many text boxes as possible I guess, but that doesn't seem to be very efficient (and the base form is already at 210).  Is there anyway to add in controls (such as text box or label) if a new appointment is added at the same time as existing ones?
	View 5 Replies
    View Related
  
    
	
    	
    	Dec 8, 2013
        
        I am trying to write a more complex macro that will start another macro at a preset time, however I am getting stopped at the first hurdle - getting a macro to run another macro.
Here is the code i am using at the moment, all I want to do currently is click the first button, then get the second macro to execute.  But no luck, getting error 2157 "cannot find the procedure"
Code:
Private Sub Command3_Click()
MsgBox "1st macro running", vbExclamation, "Note"
Application.Run "teststart1"
     ' Application.OnTime TimeValue("19:55:00"), "teststart1"
[code]....
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 14, 2014
        
        I write Access 2010 apps in VBA that require no knowledge of Microsoft Access on the part of the user.  My forms contain all the necessary controls to use the program without relying on any of the Microsoft Access toolbars. I call this "de-Microsofting" the app.  When I prepare the .accdb program to create a .accde app, I uncheck every checkbox (Options/Current Database) except "Compact on Close".  This works well, but it also hides the Windows taskbar at the bottom of the screen.  Some of my users need to be able to jump from my app to others (e.g., Excel) and back without having to exit my app. How can I force the Windows taxkbar to always be on top using VBA or, possibly, some setting?
	View 4 Replies
    View Related
  
    
	
    	
    	May 29, 2015
        
        I have a query that formats data into a list of personnel who are coming due for refresher training.  The query is formatted to provide me all the details that I need to create an outlook task, and assign it to the person.  I tried creating a button on my form to create a record set of that query, and then create / assign a task to each person based on the values from the recordset.
Code:
Private Sub SendTasks_Button_Click()
'Create the recordset and set it to the appropriate query
Dim rst As DAO.Database
Dim rstData As DAO.Recordset
Set rst = CurrentDb
Set rstData = rst.OpenRecordset("SendTasks_qry")
[Code] .....
Basically, the compiler stops at "Dim myOlApp As New Outlook.Application" with the error: "Compile error: User-defined type not defined"
	View 14 Replies
    View Related
  
    
	
    	
    	Jul 11, 2013
        
        I am wondering if it is possible to send a report as xls file and keep the format exactly as the report looks.When I try to send it now, it automatically changes back to the column names from the table, which I in the report have changed and want to keep in my excel output! 
	View 3 Replies
    View Related
  
    
	
    	
    	May 25, 2013
        
        I have an unbound form with an associated report.   When the user hits the 'print' button on the form/screen, the report is  launched in the background.  In the On Load event of the report I  populate the report fields from the forms field as so:
Code:
Me.txtAddrMainLine2 = "NAME " & UCase([Forms]![frm_OrderRx].[txtPatientName])
This  works like a charm as long as I call the report in Print Preview mode  (i.e. with acViewPreview).  But if I send the report directly to the  printer, none of the fields print. 
I've read about using  other report events to populate the fields (e.g., On Format and On  Print) and also something about using TempVars to pass the data.  But I  haven't read anything that's clear and definitive about the full answer.  
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 29, 2005
        
        Hi Guys,
Im new to access and i have a problem!! I have a report that i need to be sent out monthly to 3 people. The problem is i dont know where to start. I have been looking through the forum, but nothing that i can get my head around, so there anyone out there who can help???????
Thanks in advance!!!
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 18, 2004
        
        I am trying to send an MS Access 'report' as an attachment to a mail recipient in rtf format without success.  Everything seems to work fine except the 'send' button.  Click away and nothing happens.... no error messages, no nothing.  Any suggestions or tips on how to make this work?
 
Thanks...
	View 2 Replies
    View Related