Modules & VBA :: Add Contact From Outlook - Command Or Action Not Available
Jul 26, 2015
I am trying to use
RunMenuCommand
command : AddContactFromOutlook
But i get this error message
"The command or action AddFromOutlook isn't available now "
on a demo access "project manager" it works but in my data base does not ...
View Replies
ADVERTISEMENT
Jan 8, 2014
Microsoft has a Desktop Student Database template (Access 2010) that does exactly what I'm trying to do:
open the Outlook Contacts dialog box, select a contact from the GAL, and then programmatically save it to a record in one of my tables.
I've tried simulating the button/coding on my data entry form, but I'm getting the error:
"The command or action 'AddFromOutlook' isn't available now"
I've search high and low but have only found a reference to creating a temp contacts table to import all the contacts.
View 2 Replies
View Related
Feb 3, 2015
I'm using an unbound text box and a command button to filter a list of contacts on a continuous form. The continuous form has a query for the record source and the list ends up showing only what is in the strWhere filter
Me.Filter = strWhere
Me.FilterOn = True
Is there a way to have Access 2003 take this filtered list and populate the To: field in Outlook or whatever the default mail client is? Each email needs to be deliminated by ";"
View 5 Replies
View Related
Jan 21, 2013
I would like to know how on a report to make a button action that when i click it present information from contact list (full contact details).
View 1 Replies
View Related
Aug 29, 2014
I have a form that uses the command AddContactfromOutlook. I used the standard example given by Microsoft and it works flawlessly in the form. When I use the form as a subform this command button breaks.
View 3 Replies
View Related
Feb 16, 2006
I have the following code working great with creating new contacts in Outlook from Access. My problem is I can't figure out a way to update already existing contacts in Outlook.
Function AddContacts()
Dim OutlookObj As Outlook.Application
Dim Nms As Outlook.NameSpace
Dim MyContacts As Object
Dim MyItems As Object
Dim MyItem As Object
Dim Db As Database
Dim Rst As Recordset
Set Db = CurrentDb
Set Rst = Db.OpenRecordset("CustomerOutlook", dbOpenDynaset)
Set OutlookObj = CreateObject("Outlook.application")
Set Nms = OutlookObj.GetNamespace("MAPI")
'to point to a nested folder in Outlook you have to create folder items in folder items:
Set MyContacts = Nms.Folders.Item("Public Folders").Folders.Item("All Public Folders").Folders.Item("Our Contacts")
Set MyItems = MyContacts.Items
While Not Rst.EOF
'Declare which form to be used to add your contacts
Set MyItem = MyItems.Add("IPM.Contact")
'add fields, to find out which fields are available take a look at all the available members of the
'ContactItem class in the Outlook object library.
'Be careful, Microsoft is using various names for outlook fields!
MyItem.CompanyName = Rst!BusinessName
MyItem.FirstName = Rst!CFirst
MyItem.LastName = Rst!CLast
If Not IsNothing(Me.WebSite) Then
MyItem.WebPage = Rst!WebSite
End If
If Not IsNothing(Me.CMiddle) Then
MyItem.MiddleName = Rst!CMiddle
End If
If Not IsNothing(Me.Suffix) Then
MyItem.Suffix = Rst!Suffix
End If
MyItem.JobTitle = Rst!JobTitle
MyItem.BusinessTelephoneNumber = Rst!Phone
MyItem.Business2TelephoneNumber = Rst!BackPhone
MyItem.MobileTelephoneNumber = Rst!Mobile
MyItem.BusinessFaxNumber = Rst!Fax
MyItem.Email1Address = Rst!Email
If Not IsNothing(Me.Address1) Then
If Not IsNothing(Me.Address2) Then
MyItem.BusinessAddressStreet = Rst!Address1 & ", " & Rst!Address2
Else
MyItem.BusinessAddressStreet = Rst!Address1
End If
End If
MyItem.BusinessAddressCity = Rst!CCity
MyItem.BusinessAddressState = Rst!CState
MyItem.BusinessAddressPostalCode = Rst!PostalCode
MyItem.Categories = Rst!CustomerType
MyItem.FileAs = Rst!BusinessName
'MyItem.Etc = Rst!Etc
MyItem.Close (olSave)
Rst.MoveNext
Wend
End Function
View 2 Replies
View Related
Nov 3, 2004
I've researched all the email topics, but can't find what I am trying to do.
Most of these topics are talking about emailing a record or form or something.
I have a form that contains thousands of contacts address, telephone, email, etc.
I would like to create a button that on click would open Outlook and grab ONLY the
email of the current contact I am looking at on the form at that time and add that
email address to the [To:] box of a new email.
Thanks you guys, I'm learning...slowly, but it's coming.
View 4 Replies
View Related
May 31, 2012
How to I can to add contact with field "Notes" (Type: Memo) in MS Access to field "Notes" in Outlook contact
Is it below ???
item.Notes = varNotes & ""
View 8 Replies
View Related
Aug 6, 2012
I have an Access 2007 SQL database with 20 users. The DB has a list of about 3,000 email addresses that I want to export to Outlook for mass mailing. I've already got the services of an SMTP mail service that allows 1000 mails at a pop to be sent, and I've already written in the logic to separate the list into groups of 1k.
The problem I'm having is that I'm currently exporting from Access 2007 to Excel 2003 format (for some unknown reason Outlook 2007 does not directly interface with Access 2007), and then I have to manually go through the import steps within Outlook to bring the data from each 1k name group spreadsheet into a contact group for mailing.
It all works fine as it is, but it's clunky as hell. I want to automate that process, but I'm not very familiar with Outlook. I'm not even sure what the file format is for a group. Surely it must have its own format, like group1.xxx, or something. My ultimate objective is to export straight from access to the .xxx (whatever it is) format, direct it straight to the appropriate folder within Outlook and in the process eliminate the need for the more tedious steps required to import each Excel file within Outlook that I'm currently using.
View 8 Replies
View Related
Sep 7, 2006
Hi all,
I have a database for customer enquiries, and there is one record per product that the customer shows interest in. I want to have a button on the enquiry details form that creates a new enquiry but automatically fills in the contact details from the previous record.
Please also note that I do not wish to "normalize" this so that there is a seperate table for contacts and another for enquiries; it's much easier from our point of view to have the whole enquiry in one record, especially as this is a stand-in database before a fully integrated CRM is implemented. In any case most of the other data (e.g. product, category etc) is already stored in separate tables.
What sort of method do I need to use to create a Command Button that:
-Creates a new record
-Copies and Pastes data from selected fields into the new record?
I tried using the command button wizard for sample code but I got paste errors which were pasted into a new table, and I don't really understand the process of how this works as the Commands are numbers from a list (apparently in the macro window), which I can't find.
I'm using Access 2003 but the database file is in A2000 format. The code is below.
Thank you!
Private Sub ContactAddEnq_Click()
On Error GoTo Err_ContactAddEnq_Click
DoCmd.DoMenuItem acFormBar, acEditMenu, 8, , acMenuVer70
DoCmd.DoMenuItem acFormBar, acEditMenu, 2, , acMenuVer70
DoCmd.DoMenuItem acFormBar, acEditMenu, 5, , acMenuVer70 'Paste Append
Exit_ContactAddEnq_Click:
Exit Sub
Err_ContactAddEnq_Click:
MsgBox Err.Description
Resume Exit_ContactAddEnq_Click
End Sub
View 2 Replies
View Related
Jun 17, 2005
I have created a search window that looks up certain invoicereport by invoice No. I have used this search method in other forms and has worked successfully!
However,
after I created the same thing for a report, I get this message: The Command or Action 'ApplyFilterSort' isn't available now.
I really don't understand the problem.
txtSearch = a textbox where user can type in any value to lookup a certain report.
rptInvoice = where I want the search to be placed.
fraSearch = an option group with (Starts with...,Contains...,Ends with..., Equals...)
InvoiceNo = the txtField in rptInvoice.
this is what I wrote for the cmdSearch button:
Private Sub cmdSearch_Click()
On Error GoTo Err_cmdSearch_Click
Dim strFilter As String
Dim strInvoiceno As String
' Check that the report is open
If SysCmd(acSysCmdGetObjectState, acReport, "rptInvoice") <> acObjStateOpen Then
MsgBox "You must open the report first."
Exit Sub
End If
' Build InvoiceNo criteria string
If IsNull(Me.txtSearch.Value) Then
strInvoiceno = "Like '*'"
Else
Select Case Me.fraSearch.Value
Case 1
strInvoiceno = "Like '" & Me.txtSearch.Value & "*'"
Case 2
strInvoiceno = "Like '*" & Me.txtSearch.Value & "*'"
Case 3
strInvoiceno = "Like '*" & Me.txtSearch.Value & "'"
Case 4
strInvoiceno = "= '" & Me.txtSearch.Value & "'"
End Select
End If
' Build filter string
strFilter = "[invoiceNo] " & strInvoiceno
' Apply filter to report
With Reports![rptInvoice]
.Filter = strFilter
.FilterOn = True
End With
DoCmd.DoMenuItem acFormBar, acRecordsMenu, 2, , acMenuVer70
Exit_cmdSearch_Click:
Exit Sub
Err_cmdSearch_Click:
MsgBox Err.Description
Resume Exit_cmdSearch_Click
End Sub
----
Could anyone help me with this?
View 1 Replies
View Related
Jul 11, 2014
I have a form for users to be able to delete or edit records. I have 2 command buttons (Delete and Save), when I click on them I get this error "the command or action is not available now"... It was working fine before but for some reasons it stopped. Even two other buttons actioned by vba codes do not work (No message popping up for these 2)
I checked:
Allow Additions: Yes
Allow Deletions: Yes
Allow Edits: Yes
Nothing is blocked or locked.
I think it has to do with the query my form is based on, as I tried a dummy form based on a table and the button worked fine...? I tried re-creating query+form and no luck. I did remove a field from my query at some point this morning, not sure if this might be the cause of issue, as this field was not connected to anything in my form.
View 2 Replies
View Related
Dec 5, 2013
I am trying to add a command button to my main menu to open the contact names as a datasheet, I have changed the properties on the contact names form to datasheet as well as changing the properties on the button to the below:
Private Sub Command48_Click()
DoCmd.OpenForm "Contact Names", acFormDS
End Sub
at first after I saved it, the button did nothing. Now after a bit of playing around (probably not a good idea) I have a new message that states:"The expression On Click you entered as the event property setting produced the following error: Ambiguous name detected: Contacts_Click.To add some additional information, in the vba sheet above the code i wrote above it says:
Option Compare Database
Private Sub Contacts_Click()
DoCmd.OpenForm "Contact Names", acFormDS
End Sub
Private Sub Contacts_Click()
DoCmd.OpenForm "Contact Names", acFormDS
End Sub
should I delete this?
View 5 Replies
View Related
Jun 18, 2013
I have a query that gets it's data from tblContacts. In this table is a yes/no field for archiving and the query gets only those records with a No in the field. The default is no. Next I have a form based on this query, which I am using to hold a set of command buttons which act on a contact chosen from an unbound list. So far so good but now I would like to add a command that changes the contact's status in the archived field of the table to Yes, so that I can use the form to view/edit, or email, or archive.
View 1 Replies
View Related
Aug 29, 2005
Hello,
I am having trouble making a command button do what I want. I have a subform within my form, but I only want it to appear when I click the button. I tried using the wizard but there is no option to open subform, only open form. Any thoughts would be greatly appreciated!
View 1 Replies
View Related
Apr 17, 2007
Hi,
I am getting this error "The command or action 'Show all records' isn't available now", i get this when i try to do
DoCmd.ShowAllRecords
DoCmd.GoToControl ("ID")
DoCmd.FindRecord Me!Text116
I am trying to do search on ID..but i get this error and i dont know how to proceed..
P.S My form displays all records(say 6000), it has a search functionality where a search on particular ID should be done, i am trying to do this and dont know whats happening even though this seems to be easy (
Please help!
Thanks!
View 1 Replies
View Related
Mar 25, 2014
Code:
Private Sub Command124_Click()
On Error GoTo Err_Command124_Click
Dim stDocName As String
Dim stLinkCriteria As String
stDocName = "PRINTSQUARE 1"
DoCmd.OpenForm stDocName, 3, , , , 4
Exit_Command124_Click:
Exit Sub
Err_Command124_Click:
MsgBox Err.Description
Resume Exit_Command124_Click
End Sub
An command button would open a form to display some query result, and how could I do something after user exit that form!! I have tried to put some action afater the Docmd and EXIT_COMMAND124_CLICK:, both didn't work!!
View 3 Replies
View Related
Jan 13, 2014
I've rebooted my copy record button and just used the macro wizard for now, it seems to work as far as I can tell but there is something strange about it.
I've added in some text boxes so I've got some confirmation, but when I click this copy button I get the following error;
"The command or action 'RecordsGoToNew' isn't available now."
View 1 Replies
View Related
Mar 7, 2006
Hi Folks,
No hits on a search of this site for this error. I think this is a security or corruption problem.
From the main dialogue form of my database some users get the "The command or 'SaveRecord' Action isn't available now." error when they try to run a report or perform an update. The report is launched by code which includes the SaveRecord command.
Everything operated correctly with the administrator logged in. The users have appropriate permissions to tables etc. However, I made some small modifications to the form and then the report / save would not run for the Administrator either.
Things I have tried to resolve this:
Giving users full permissions - same as adminstrator
Making new database and importing all items
removing security from back end
I also tried half a dozen other things of varying logic and relevance that didn't work either.
Anybody have any idea what is going on / how to procede?
Regards,
Keith.
View 4 Replies
View Related
Sep 17, 2014
I have inserted a function via a module at the beginning of a Macro using the RunCode action:
Function Msgbox_Yes_No()
Dim Response As Integer
Response = MsgBox(prompt:="Select 'Yes' or 'No'.", Buttons:=vbYesNo)
If Response <> vbYes Then
End If
End Function
However, it doesnt stop the macro from continuing on its way to delete a load of records if the user chooses no.
View 3 Replies
View Related
Apr 4, 2015
I have a form that opens when you initially open the MS Access file...
This first form posts session and user ID data to a sessions table, then closes itself and opens an end user form (i.e. the main form in the application)
It's work just fine for many weeks, up until a few minutes ago. Now, when I open the MS Access file I get this error message:
Run-time error '2501':
The OpenForm action was canceled.
When I choose "debug" from the error message, it's showing me that the error happens here:
Code:
Public Sub CloseMeAndOpenMain(frmMe As Form)
DoCmd.Close acForm, frmMe.Name
DoCmd.OpenForm "0100_0000_STRAT_AND_REQ_ASSEMBLY_ECs_LISTING"
End Sub
The thing is, I can then walk through the code with no issues (i.e. when I hit F8, it runs...)
Also when I open the first "sessions" form from inside MS Access (as opposed the file open feature) it runs just fine and opens the main end user file without any issue.
I only get the error when I initially open the first form from the file...
View 1 Replies
View Related
Jan 16, 2014
I'm trying to setup a process of opening a form, saving to a location, emailing it as a PDF, killing the PDF, move onto the next form - rinse wash repeat until done.The below works fine on a single click, however if I try to set it as an event timer of loop, I get an error saying: This action cannot be carried out whilst processing a form or report event.
Do
Dim outputFileName, Ref As String
Ref = Vici_URN
outputFileName = CurrentProject.Path & "Claim PackagesCICA" & Ref & " - " & Format(Date, "yyyyMMdd") & ".pdf"
[code]..
View 1 Replies
View Related
Jul 10, 2015
I have a button on-click action of:
Code:
DoCmd.OutputTo acOutputReport, "Bladereport", "PDFFormat(*.pdf)", , True, "", , acExportQualityPrint
It works perfectly with the box appearing to choose the directory and file name, having done this it then outputs perfectly.
However if you choose cancel at the file and directory selector box it crashes:
Run-time error '2501':
The OutputTo action was cancelled.
View 1 Replies
View Related
Jun 2, 2015
I've got a continuous form, with a button (cmd1) on each record. Each record has a unique primary key, RecordID. cmd1 is clicked to open a form (frm1) based on the RecordID using the following code:
Code:
DoCmd.OpenForm "frm1", , , "RecordID = " & Me.RecordID
I want frm1 to open, ONLY when a user clicks on cmd1 while it's already in focus ON that specific record.
View 14 Replies
View Related
Mar 4, 2014
Is there a way to check if a series of action queries can be run (without any error) before actually running the queries?
View 1 Replies
View Related
Aug 19, 2013
I've discovered that when I press control and A inside a memo field instead of the whole field text being selected the whole record is selected.
How do I disable shortcut keys or how do change the action of the existing shortcut keys?
View 9 Replies
View Related