Modules & VBA :: Send Data From One Database To Another
			Mar 28, 2014
				I have two databases, both have mysql backened and access frontend.
In first database, I'd like to access the second database, check if that person has an entry in the second database and then fetch that data into the first database. To make it easier, data come from different tables (though I'd probably access only one entry in each table)
Not sure where to start, the only idea I have is to link tables from both databases into the frontend ad then it's kinda easy (would have to rename the tables).
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Aug 17, 2015
        
        Is it possible to send an email from an access 2007 database with a category?
	View 8 Replies
    View Related
  
    
	
    	
    	Aug 22, 2007
        
        Hello
I need to send data from a mdb on an xp machine every 15min. Any tips on how to do this?
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 24, 2015
        
        I have code that from DB1 opens DB2 and runs a Function in DB2.
 
The DB2 function produces a Boolean result that i am trying to get back to DB1 without success. Below is the script.
 
Sub Test22()
Dim AC As Object
Set AC = CreateObject("Access.Application")
rc = "K:ARSHRAutomation_ProjectsMikeFEDB2.accd  b"
AC.OpenCurrentDatabase (rc)
AC.Visible = True
AC.Run "SendVariable"
End Sub
 
Because i am using AC.Run "SendVariable" i cant find a way to get the value of SendVariable!!
	View 2 Replies
    View Related
  
    
	
    	
    	May 30, 2014
        
        I currently have two e-mail accounts on my computer.  One is my default e-mail address with my name on it.  The other e-mail account is a generic account with the department name.  
I have a database set up to generate and send e-mails to our technicians notifying them when an order they placed gets put on back order.  This database could possibly send twenty or thirty e-mails out each time it is run.  My manager has requested that the database send the e-mails from the generic e-mail account instead of the default account.  That way, when the field replies to the e-mail, they won't bombard my account.
Is there a way to tell the database which e-mail account to send an e-mail from?
I am currently using the below module to send the e-mails:
Option Explicit
Dim appOutlook As Outlook.Application
Dim namespaceOutlook As Outlook.NameSpace
Sub Outlook_SendMail(sEmailAddr As String, sEmailSubj As String, sEmailBody As String, Optional sAttach1 As String, Optional sAttach2 As String)
[Code] ....
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 4, 2013
        
        I have 2 form, form1 and form 2 (picture attached)
In Form 1 
(main form) there are "reference" field with key pressed event
then call form 2 (list of reference that user can choose)
In form 2
the problem is, when "enter" key pressed (keypress event), selection will move to next record
so the data that transferred to form 1 is wrong (next record)
The question is : how to save current record in form 2 before enter and send the data to form 1
	View 3 Replies
    View Related
  
    
	
    	
    	May 28, 2012
        
        How do you Send SMS from Access database? I received a SMS from my dentist and the receptionist told me that the database sent it. I was wondering how it is done.
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 11, 2015
        
        I need a form that will send a email to certain contacts depending on which box is ticked
Have never done this previously would this be possible
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 6, 2004
        
        Hallo everybody
I have an Access databse in which I have devided the tables into backend and frontend by using the Database Splitter wizard.
Then if I create any tables in the frontend Access file then thease tables are visible only in the front end of this system , not from other systems if I put the back end in network.
its ok for some tables , but now I have a table which I have to put in the shared backend , but if I cerate in the front end it is visible only in front end and if I create in backend it is visible only in backend.
how to send a table in the front end to backend after database splitting is over, so that I can access this table from other systems.
if it is possible please help me.
Thank you.
Kiran
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 17, 2013
        
        I have been trying to figure out this issue concerning the memo field in the database will only send about 255 characters. I am using the cmdEmail AssignedTo : On Click macro and the Message text and have two memo fields and only one will display and the one that does only displays about 255 characters
 
The message text ="Issue" & ":" & Chr(13) & [COMMENT] & Chr(10) & "Resolution" & ":" & [RESOLUTION] & Chr(10).
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 25, 2011
        
        I want to develop (create) a database using MS Access 2007 or 2010 about Amazon.com. 
 
My ideas are:
1. Create a form to lookup items in the actual amazon website, and then sort the results of the search. 
2. View the results. If I select Add to Cart or Add to Wish List, send the item information to my Access database.
	View 3 Replies
    View Related
  
    
	
    	
    	Dec 18, 2013
        
        I have a contact form on our website which sends an email to the business dev team saying that the user has requested to be sent product sheets. The email contains the users name, email, phone number, and a few other fields. Is there a way I can send the details of these emails to my access database automatically?
	View 9 Replies
    View Related
  
    
	
    	
    	Sep 17, 2013
        
        I have been asked to add features (and fields) to an existing database containing private medical data. The idea is to add features to the empty database, test it with fake data, purge the fake data and deliver it to the user in another state with a simple update button. The Access 2010 database is in one piece (No front/back end).
I am looking for the best/shortest VBA method to move a lot of preexisting field data from the old database to the new version. I think I have it mostly figured out; I have code for counting, reading and writing the table names, field names and field data. 
However, because the data types vary within the tables and there will be new fields in the new versions tables, my only idea, so far, is to code through the data table-by-table and field-by-field, a lengthy process with a large footprint. Moving entire tables or complete records may not be effective. Any faster way to transfer all these tables field data?
	View 3 Replies
    View Related
  
    
	
    	
    	May 13, 2015
        
        I have an append query that adds data to a table in another database, but I want it to replace the data every time it's run.  How do I clear the data before running the append query?  The databases are not linked, and I don't want them linked.
	View 9 Replies
    View Related
  
    
	
    	
    	Jul 9, 2006
        
        Hi,I have 2 forms. form1 & form 2.Form1 is full with textboxes etc, so for one task (datainput from user), i want to open a new form (form2). 1. How can I send data (in this case, a registrationID) from form1 to form2?I would like to do it in a button click event (that opens form2, the button is placed on form1) like this: form2.textbox.value = ID, but it doesnt work. Any suggestions?I am fairly new to Access (but familiar with VB in Visual Studio 6)I plan to open form2 from form1 by clicking a button, i guess its therefore no "subform".Thanks for your help !
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 17, 2014
        
        I have a requirement to send a email to individual clients via my access database 2003 . I am using the email address of the client in the current open form . I then created a query using the id to filter that particular client, this query then becomes my record set.The content for the email is held in a .txt file , On my c drive . Every things appears fine however the fonts that I select in the .txt file are not being use in the actual email body. I created a word document with my preferred fonts and copied and pasted them into the .txt file but on sending the email the selected fonts do not appear.
I have attached a demo of what I am trying to do . To test enter your own email in the email address field of the form . Note the .txt file is on the C:/ drive.
	View 4 Replies
    View Related
  
    
	
    	
    	Feb 11, 2014
        
        I have the code for sending an email but I only want to send a single email when there are records in a query and only when the database is first opened.
 
I hadn't considered this in my design so what structural requirements would it require if any?
	View 5 Replies
    View Related
  
    
	
    	
    	Jul 22, 2015
        
        I currently have a code set up which sends an attachment from a drive on my computer to all the email addresses in a certain query. I would like to change the code so that I can add a button that will allow me to send an email with a specific attachment depending on their individual code in a table, e.g each person will receive a specific attachment. At the moment, the attachments are saved with the same file name as the person's specific code.The code I am currently using is:
Private Sub Command9_Click()
Dim MyDb As DAO.Database
Dim rsEmail As DAO.Recordset
Dim qdf As DAO.QueryDef
Dim prm As DAO.Parameter
Dim strEmail As String
Dim strMsg As String
Dim oLook As Object
[code].....
	View 9 Replies
    View Related
  
    
	
    	
    	Jul 26, 2014
        
        Since my old DB had hyperlink (web pages) either starting with http:// or not, and the users were complaining that they couldn't easily edit the field, I converted all the fields to text. Then I tried the following code on doubleclick:
 Dim WebLink As String
If Me.WebPage2 <> "http//" & "*" Then
WebLink = "Http://" & Me.WebPage2
Else
WebLink = Me.WebPage2
End If
Debug.Print WebLink
Application.FollowHyperlink WebLink, , True
The above works fine if there is no http:// but if there is one already in the text, then I get run time error 5 that it cannot locate the page.  On checking what is happening, the code is adding http://  again even if it already there.
	View 7 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
  
    
	
    	
    	Apr 28, 2015
        
        Is it possible to send several  form's OpnArg as Array ? Now I'm using a long text string including || as divider so I can split them later into Array.
	View 8 Replies
    View Related
  
    
	
    	
    	Feb 4, 2015
        
         I have a button when pressed that it sends an email from lotus notes and inputs relevant text etc, however I seem to be struggling on how to have an attachment sent with the email. So everytime the button is pressed it will attach a word document. 
	View 1 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
  
    
	
    	
    	Jul 13, 2013
        
        A client wants to e-mail newsletters using a non-default Outlook account.  The code below does everything the client needs except setting the SendUsingAccount.  In debug I can see that the correct account is assigned, yet all of my testing results in e-mails where the From line is the default account.  The test setup uses my own isolated SMTP server, so when I look at the e-mails sent the sender is the default account.  The default account's Sent folder shows the sent mail, which is not what we want.  
Code:
Sub prepEmail()
Dim frm As Form, startDate As Date, endDate As Date
Dim rs As DAO.Recordset, strSQL As String, intNewsLetter As Integer
Dim rsEmail As DAO.Recordset, rsNewsletters As DAO.Recordset
Dim OlApp As Object, ol As Object
Dim olMail As Object, olAcct, olAcctTemp
[code]...
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 8, 2013
        
        I'm using VBA and XML to send emails from my db to a legitimate mail server (Mandrill).
The mail server will accept any number of receipients in one go.
I'm using an SQL string to build up my recipients into one large string (phil@test.com; fred@test.com etc). This works well as it builds them list at about 50 per second.
The issue I have is that I get an error saying 'Too many recipents'.
How many will SMTP let me send in one go?
	View 1 Replies
    View Related