Modules & VBA :: Creating Appointment Based On Sessions - Send Method Not Working?
			Jul 17, 2013
				I have a module in my database that creates an appointment based on a table of sessions. The module works in all respects, except two:
1) When I declare optional attendees it sometimes shows them as required attendees in the actual meeting in outlook, but not always
2) The .Send method does not seem to work. It creates the appointment on my calendar as the originator of the appointment, but does not send to the other recipients. 
Below is the code: 
Code:
Private Sub SchedOutlook()
Dim rsEmployee As DAO.Recordset
Set rsEmployee = CurrentDb.OpenRecordset("Select * FROM Employee INNER JOIN tblSession ON Employee.EmpID = tblSession.EmpID;", dbOpenDynaset)
Dim rsMentor As DAO.Recordset
[Code] ....
	
	View Replies
  
    
		
ADVERTISEMENT
    	
    	Sep 6, 2006
        
        HI all, Im fairly new at Access, nut ive been given the task of creating an appointment scheduling form, so that we can schedule a client for an appointment via this form.  
The idea i had in mind was to use a calendar to query the appointments table so that we can view all appointments for any particular day.
any suggestions?
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 26, 2014
        
        Can I use html to format the message body in send object method ?  If I can, how to do that.
	View 5 Replies
    View Related
  
    
	
    	
    	Mar 19, 2014
        
        I am trying to make an automation in order generate reports based on query ( person name,person email address ) , export them to a folder in PDF and then send them one by one to each person email address.
What is happening:
- the reports are generated and exported fine
- the email are sent to the right addresses but the first person receives the correct report , the second person receives the report from the first person plus its own report and so on.
Here is my code :
Private Sub MakeReportSendEmail_Click()
Dim MyDB As DAO.Database
Dim MyRS As DAO.Recordset
Dim strSQL As String
Dim strRptName As String
[Code] ....
	View 14 Replies
    View Related
  
    
	
    	
    	Jun 5, 2014
        
        i have created a MultiSearch query witch puts my results in a list box.under it i have created a button  wich i want to use to print  a report with the criteria i select from my list box if there is more than one result.
Following is the Code i used for my button
 On Error GoTo Err_Command60_Click
    Dim stDocName As String
    Dim stLinkCriteria As String
    stDocName = "ReportLable"    
    stLinkCriteria = "[ProductID]=" & Me![SearchResults]
    DoCmd.OpenReport stDocName, , , stLinkCriteria
Exit_Command60_Click:
    Exit Sub
Err_Command60_Click:
    MsgBox Err.Description
    Resume Exit_Command60_Click
Every time u press the button i get a message syntax error(missing Operator) in query expression
Now i have not used any code in my Query except for
 
Like "*" & [forms]![frmSearchFor]![SrchText] & "*"
Where i made the error
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 30, 2013
        
        I have some code that creates queries based on a value in a checkbox.
So, depending on that value, the queries may or may not exist.
I need to take those queries (if the exist) and create one union query.
This code creates the first query beautifully, but it won't union the second query.
Code:
Private Sub cmdSubmit_Click()
    Dim blnQueryExists As Boolean
    Dim cat As New ADOX.Catalog
    Dim cmd As New ADODB.Command
    Dim qry As ADOX.View          
    blnQueryExists = False
[Code] ....
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 17, 2014
        
        I've changed my splash screen for a database using the method of creating an alternative bitmap.Is there a time setting for this or an alternative?
	View 6 Replies
    View Related
  
    
	
    	
    	Aug 2, 2013
        
        Table name: Items
Field: ItemName
Form name: Frmpayments
 
when I open the above form, it should create texts boxes on "frmpayments" based on how many data available in "Items" table under "Itemname" field. It'll be even better, if it can put those item's name in each text box it creates.
	View 1 Replies
    View Related
  
    
	
    	
    	Dec 3, 2013
        
        I use the code below which creates an appointment in Outlook default calendar. I need to add a few lines to create the appointment to an alternative calendar in the same pst file. I need to choose between three calendars in which to create the appointment and plan to select the calendar name from a list on the form.
Dim objOutlook As Outlook.Application 
Dim objAppt As Outlook.AppointmentItem 
Set objOutlook = CreateObject("Outlook.Application") 
Set objAppt = objOutlook.CreateItem(olAppointmentItem) 
[code]....
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 19, 2014
        
        I am very new to VBA. I found some code that will allow me to add an appointment to my personal calendar with using access VBA and it works great. It also allows me to add an appointment to another calendar created under "My Calendars" folder.
  
 I wanted to know how to change the code in order to add the appointment to the SHARED calendar instead.
  
 The main folder is called "Shared Calendars" which is at the same level as the default "My Calendars" folder. Under the "Shared Calendars" folder the calendar is called "Tester".
  
Here is the code im using at the moment: I believe I have have to change the line of code that is in red but I don't know how. 
  
 Private Sub cmdAddAppt_Click()
On Error GoTo cmdAddAppt_Err
    Dim outobj As Outlook.Application
    Dim outappt As Outlook.AppointmentItem
    Dim olNS As Outlook.NameSpace
[Code] ....
	View 1 Replies
    View Related
  
    
	
    	
    	Dec 4, 2014
        
        I have been able to successfully set up code to be able to add appointments to microsoft outlook based on data within a few forms that I have. My question is this however, how do I get access to make that appointment to a specific calendar on outlook. This calendar is a shared calendar. Currently, access is just adding the appointments to "My Calendar" and I could like it to place the appointment on "HVCalendar". a version of the code I found online is listed below: 
Private Sub btnaddappttooutlook_Click()
'On Error GoTo ErrHandle
Dim olNS As Object
Dim olApptFldr As Object
' Save the Current Record
If Me.Dirty Then Me.Dirty = False
[code]...
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 2, 2008
        
        I would like to create a database that would enable me to select various options (from dropdown lists) which I could then have tidily arranged in an email that would automatically be sent to the recipient.
Before I attempt to design the facing page I'd like to know if this is an option in Access?
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 18, 2014
        
        I have a python script "runAll" that takes two arguments: processID (the primary key of one table as a string) and a filename (a full file name path as a string).
Is it possible to run a python method with arguments from inside a VBA script (activated by a button press)? 
My python script is called XMLGenerator.py, and the method I want to run is called runAll(processID,filename).
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 13, 2015
        
        I have the below script:
 
For Each Item In offexchfldr.Items.Restrict("[SenderName] = '" & frmfm & "'") ' Select Items that match Sender Name on form
    If Item.TaskSubject = subid Then
        Item.Categories = frmcat  ' Update category from form to outlook
        Item.Save
    End If
Next
 
This script checks every item in the outlook inbox where the item.SenderName = my database sendername
 
This works every time except for when the sendername has quotes or single quotes in their name. So i am trying to utlize the replace method on the item sendername before trying to find the items in the inbox but its not working. 
Below is my attempt that does not work.
 
For Each Item In offexchfldr.Items.Restrict("Replace([SenderName],',"") = '" & frmfm & "'") ' Select Items that match Sender Name on form
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 20, 2013
        
        On my form I have a set of fields that can be displayed as editable or read-only depending on a "Lockout" checkbox for that record.Is there an easier way of doing this? If not, would it be smarter to create a function to do this? As it stands I'm assuming I would have to have this code run when the form loads, when the Lockout box is clicked, and whenever the record is changed just to ensure that the records are displayed as locked or unlocked appropriately.
 
Here's what I have:
Code:
Private Sub Lockout_Click()
If [Lockout] = True Then
   Me![Customer_Text].Enabled = False
   Me![ReqDesc_Text].Enabled = False
   Me![MoreInfo_Text].Enabled = False
[code]....
	View 4 Replies
    View Related
  
    
	
    	
    	Jan 19, 2015
        
        i have the following code in a function but when i want to compile it i have the following code will be blue i have error in this line:
 
.NamedParameters = True
  
the error message is this :
 
method or data member not found
 
my code is as following:
 
Function Get_Bearbeiter_Detail(ByVal vBearbeiter_Code As String, Optional ByRef vBearbeiter_Name As String, Optional ByRef vReadOnly_Flag As Boolean, Optional ByRef vAnalyser_Flag As Boolean, Optional ByRef vAdmin_Flag As Boolean) As Boolean
On Error GoTo Err
   DoCmd.Hourglass True
    Dim rst As ADODB.Recordset
[code].....
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 28, 2007
        
        Hello all!
I've got a problem...
My application is protected with username and password. According to the user who has done the log in, some options will be available and some not.
Then, are there sessions in access?? How can I know who is loged in with which role otherwise?
My idea is to have a table, and say, loggin ok for the user X, but there may be one or more users at the same time. Then, how can I know which user is who if two are logged in in the same application by remote connection?
bfffff.... hope i make myself clear...
	View 6 Replies
    View Related
  
    
	
    	
    	Apr 23, 2008
        
        Hello,
Here is our problem:
id    port  connexion  |  idSession
1      20    1005        |     1
2      20    1005        |     1
3      20    1009        |     2
4      20    1009        |     2
5      20    1009        |     2
6      21    1009        |     3
7      21    1009        |     3
The first column is auto-incremented (primary key).
We would like the last column to be a counter which identifies each session regarding a port number and a connexion number.
Is there a SQL or Access function which would allow us to do that?
Thanks a lot.
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 23, 2013
        
        I have an access database that sends one e-mail to each individual in a table, that works fine. Now I would like to send an e-mail to the leaders of these individuals, however, some leaders have more than individual under their scope so to avoid sending several emails, I would like to know if there is any way I can send one e-mail to the person with the names of the individuals he leads in the body of the e-mail. This is the code I have that sends emails to the individuals:
Code:
Private Sub Command2_Click()
Dim MyDB As Database
  Dim MyRS As Recordset
[Code]....
	View 7 Replies
    View Related
  
    
	
    	
    	Oct 1, 2013
        
        I like this form I have that allows me to send attachment when email is entered.However, I would like to have a list box of Name and Email Address.  when selected the email address is now set (same as before but just as a drop down) I type my message etc...But the attachment part I would like to send a specific report (that connects to that email address) so that it will only send jobs connected to that person.  
Here is the code below:  
Private Sub Email_Output_Click()
'
' Email API Outlook example programming code
' Send email from to Outlook
'
Select Case Me.Email_Output_Option
[code]....
	View 9 Replies
    View Related
  
    
	
    	
    	May 27, 2014
        
        I'm writing some simple code that will filter the records on a form:
 
Option Compare Database
Private Sub cmdOpenByAnalyst_Click()
    cmbStaffNames.SetFocus
    DoCmd.OpenForm "BICReviewForm", acNormal, , "Staff Assigned=" & "'" & cmbStaffNames.Text & "'"
    
End Sub
 
Unfortunately, I keep getting a run-time error (3075) that says "Syntax error (missing operator) in query expression 'Staff Assigned = XXXX"
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 11, 2014
        
        My question is which method of finding the last record is best, QueryDef or Recordset? Here is my data:
Table:
tbl_module_repairs
Field:
aps_rma
Textbox to insert last record RMA into:
txt_test
Here is some code I tried but get an invalid argument msgbox:
'''''''''''''''''''''''''''''''''
'Opens last RMA into textbox (For opening tag sheet)
    Dim dbs As DAO.Database
    Dim rst As DAO.Recordset    
    'Get the database and Recordset
    Set dbs = CurrentDb
    Set rst = dbs.OpenRecordset("tbl_module_repairs")
[Code] .....
	View 14 Replies
    View Related
  
    
	
    	
    	Dec 10, 2013
        
        I am attempting to pull data from an XML file via VBA without doing the import on external data. I created a blank table called "tblHolding". In theory, my code works the way i want which is: User clicks button, file explorer opens for them to select the file, imports data to "tblHolding", and msg box saying complete.
It runs through the code but doesn't import. It errors at the below code. Also, where do i reference the table so I can append the data.Fails saying method importxml of object application failed
Code:
Application.ImportXML strPath & strFileList(intFile), 2
Code:
Private Sub Command234_Click()
Dim strFile As String 'Filename
Dim strFileList() As String 'File Array
Dim intFile As Integer 'File Number
Dim strPath As String ' Path to file folder
Dim f As Object
[code]...
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 15, 2014
        
        I have a strange behaviour on a module which reference to Microsoft Outlook Object Library 14.0. The below code got an error 461 on the folderoutlook.display code,i.e. the method is not found. The funny thing is that the same code gives no problem in another accdb file, exactly same code with same reference on same machine. 
Set appOutlook = GetObject(, "Outlook.Application")
Set appOutlook = New Outlook.Application
Set namespaceOutlook = appOutlook.GetNamespace("MAPI")
Dim folderOutlook As Folder
Set folderOutlook = namespaceOutlook.GetDefaultFolder(olFolderInbox)
FolderOutlook.Display
	View 4 Replies
    View Related
  
    
	
    	
    	Feb 3, 2015
        
        How come its so hard to create an undo method when using a form and subform, lookup tables and tiered selections in combo boxes?
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 12, 2014
        
        Compile error: Method or data member not found
Code:
Option Compare Database
Option Explicit
  Dim intItems As Integer
  Dim strName() As String, datBirthDate() As Date, intAge() As Integer
  
Private Sub Form_Load()
  intItems = Val(InputBox("How many names do you have?", "Name List"))
[Code] .....
	View 8 Replies
    View Related