VBA Close Application Without Saving
Sep 21, 2004
I want to close an Excel application without it prompting me if I want to save it or not
that's what I use
set xlApp=nothing
it doesn't seem to work cause when I shut down my computer, it still asks me if I want to save it
looks like the application is still running in the background even if i set it to nothing
I could use xlApp.quit but I don't want anything poping up
can it be done?
View Replies
ADVERTISEMENT
Apr 29, 2015
i want that if any powerpoint application is open after closing my access app all of these powerpoint files will be closed. i found this code for excel file and i changed it for powerpoint application. but i have an error message in this pink line?
error 438: object doesn't support this property or method
Code:
Public Function test()
Dim oApp As Object
Dim workbook1 As Object
[Code].....
View 2 Replies
View Related
Oct 14, 2004
Can anyone tell me how to have Access automatically close a report without saving any changes.
I do not mind if the user closes the report manually but do not want Access to prompt the user to save changes. I want it to automatically abandon any changes that were made.
View 6 Replies
View Related
Oct 9, 2006
I have a form and one of the fields is a drop down box with autofill. If I enter an information that it is new, it doesn't show in the drop down box even after I click on the Save button I created on the form. In order to show up, I need to close the form, then reopen it again.
I am running this particular drop down box from a query in order to facilitate the autofill and because it also automatically fill other fields when the information has been already entered.
I also tried linking the drop down box directly to the table instead of the query, but it did not worked.
So basically my main problem is that in order for the new information to appear in the drop down box I need to close the form and reopen it.
Any ideas what can I do here?
Thanks
View 3 Replies
View Related
Sep 29, 2012
Trying to lock down an application by saving as ACCDE file. Saves OK but when you load application none of the controls work. I.e. button clicks do not launch "Open Form" or " Print Report" commands.But in ACCDB format application works flawlessly.
When I tried on a different machine I get an error message that says too many Table IDs. Odd since I only have 3 forms, 3 tables and 3 reports. Lots of DoCmd's and switching between the 3 forms but not sure why this would create "too many Table IDs"?
View 2 Replies
View Related
Feb 28, 2014
I have a form frmAddNewProject that is a Data Entry form.When you click Add Project on the form, it creates folders and copies files to a location and also creates new record(s) in the ProjectT table with appropriate information.Here is my code:
Code:
Private Sub cmdAdd_Click()
Dim FSO As Object
Dim FromPath As String
Dim ToPath As String
Dim FolderPath As String
Dim strType As String
Dim strYear As String
Dim strGPN As String
[code]....
Everything works fine till here. Now I would like to close the form but closing it gives me an additional empty record.
Code:
Dim ctl As Control
On Error Resume Next
For Each ctl In Me.Controls
ctl = ctl.DefaultValue
Next
Set ctl = Nothing
to remove all values, but then it just adds an empty record.Is there a way to close that form without removing my legitimate new records and without adding empty ones?
View 4 Replies
View Related
Jun 3, 2015
I have a form I would like to close without saving the record using a button. here is the code I have but it closes the form and it also writes the record to the table.
Code:
Private Sub ClosewoSave_Click()
Cancel = True
Me.Undo
DoCmd.close
DoCmd.OpenForm "frmMenu"
End Sub
I found in a thread that Cancel = True would not write the record.
View 4 Replies
View Related
Jun 5, 2013
I have a form with a child that holds a query and for 99.9% of the time remains locked as it's for viewing data only. However, if the user wishes to make a change then they need to press an unlock button first then make the changes.
The problem I have is when closing the form; if this child's query has been unlocked I'm getting a message asking do I wish to save the changes to the layout of the child's query. The answer will always be "No".
I've added the following line of code to all sorts of procedures with no success.
DoCmd.Close acQuery, "LinkTableManager_Frmqry", acSaveNo
how to stop the message appearing when the form is closed.
View 5 Replies
View Related
Jul 30, 2015
I have a timer form which closes the database after a period of time with DoCmd.Quit. Another form is open at this point but if a user has left it in the middle of editing it I want to be able to save the record in the other form and close it before the timer form closes the database.
What VBA do I need in the timer form to save the record and close the other form before DoCmd.Quit? Just to be clear the code is...
Private Sub Form_Timer()
On Error Resume Next
Me.Tag = Val(Me.Tag) - (Me.TimerInterval / 1000)
Me.Caption = "The database will exit in " & Me.Tag & " seconds"
If Val(Me.Tag) <= 0 Then
[code]...
View 1 Replies
View Related
Jan 5, 2014
it is possible to Open access application like desk application done with java or vb, or install access application as exe or similar methods. My requirements is to giving a access application to customer with data base for printing an invoice. when he running the aplication he can see access open and tables, queries forms left hand. how to hide these thing ?
View 4 Replies
View Related
Jun 11, 2007
We have an extensive reporting application in Access and would like it to be available through a web application. I've went down the road of migrating this application to SQL to use SQL Reporting Services; this is a good tool but I am wondering if MS Access has an easier solution for me other than migration to SQL.
I'm looking for a solution that will make these reports available over the web for many users. Price tag is a consideration...need to know if there is any.
Please help...thanks in advance for any thoughts!!!!
View 2 Replies
View Related
Aug 9, 2005
When putting together the final application, you don't want the user to see all the usual default menu options.
1) Which access items should I hide?
2)Let's say I make some modifications after we go live. How can I get the new forms, modules or whatever to the .mdb in use? Would I just delete the tables in the modified .mdb and then import (File/Get External Date/import) the tables with the live data?. It's not a split db, btw.
3) Are there any other options or procedures I should think about for maintainence? For instance, right now I use the compact on close option which has proved to be very useful.
Thanks,
scratch
View 10 Replies
View Related
Aug 4, 2005
Can anyone point me in the right direction to produce an application diagram.
Sort of a map of an app, what data it hold in laymans terms rathers than table and field definitions. What forms do what, and how the whole application fits together.
Thanks for any assistance you can offer.
View 9 Replies
View Related
Sep 21, 2005
This seems like a very silly question but I wondered if someone could tell me how I open up another mdb file from a form?
I've tried the following
On Error GoTo Err_Command976_Click
DoCmd.Quit
Dim stAppName As String
stAppName = "S:updateUpdateMDEUtility.mdb"
Call Shell(stAppName, 1)
Exit_Command976_Click:
Exit Sub
Err_Command976_Click:
MsgBox Err.Description
Resume Exit_Command976_Click
End Sub
But I just keep getting "Invalid Call Procedure or Argument"
Many Thanks
Andy
View 1 Replies
View Related
Jan 3, 2006
Hi, I have a large database containing information that people all over the country want to access. I've designed a main form that contains 3 subforms that queries information from raw data. Now that the database is complete, i'm looking for the best way to distribute it. I've tried to put it on the network drive, but it has been rediculoursly slow. Could somebody tell me what would be the best way to do this? Thanks!
View 1 Replies
View Related
Apr 26, 2006
Hello,
I do not want any menu bar in some application I have made using a switchboard. In the start-up function I unchecked all the checkboxes but some menu functions keep coming back. How can I overrule this?
View 5 Replies
View Related
Oct 27, 2006
I'm looking for methods to verify if an application is working correclty.
Any suggestions?
Thank you in advance.
View 1 Replies
View Related
Jan 9, 2007
Hi All!
I have created access Application and would like to document it. Do u guys have any samples, or maybe you have documented some aplication before...
Please chare,
Sincerely,
B
If you can please reply with the sample
View 1 Replies
View Related
Jun 30, 2007
I have developed an application which I want to keep safe from being tampered with by user.s So once a .mdb database application has been developed what is the best way to then distribute the application to a client (customer who has paid for the application) so that the application can't then be tampered with ?
Cheers
Frank
View 4 Replies
View Related
Jul 13, 2007
Hello,
I have finished a program with ACCESS 2007 (VBA) at work. Now, my boss wants his employees to use it from different computers. What would I have to do to make this work?? I suppose ACCESS has a runtime version or executable that I can install on every computer of the company? Or do I have to install ACCESS 2007 on every terminal (which would be very bad by the way)?? I would appreciate it if somebody would give me a hand on this since I have never done this before.
Thank you very much
PS: All the computers are on a network
View 1 Replies
View Related
Dec 2, 2007
Hello everyone,
I just developed an application and now I want to distibute it.
I want to work with licenties and I also want to make shure the software can only be installed according to the number of licences.
How do I solve this problem?
View 4 Replies
View Related
Jan 27, 2008
Dear all,
have tried searching many sites but of no help. hope this is the right place to ask my query.
I would like to develop an application with the help of which I can make phone calls through my PC (windows 2000) and record calls as required. I have come to know that TAPI is the technology to use. However how do i start and what are the requisites.
any help is appreciated.
Thanks and regards,
Prodigy.
View 2 Replies
View Related
Mar 19, 2008
I have been asked to make changes to an app that is WAY more complicated than anything I've ever done. The changes themselves are no problem (add 3 new fields to each of two tables and modify 2 forms and a report). The problem is after I make the changes the app doesn't work. The database (even stripped of all but 10 records) is too big to upload here. (2.5M)
I need to add 2 text fields (Route and Region) each 10 chars. and a yes/no field (Early Delivery) to the Order Head table and the Location table. I need to add those three fields to the Order Head and Location forms and get the info to copy over from the Location table if they select a reception location from the drop down on the Order Head form.
I have at least two possible problems. The first is as soon as I add the fields to the table and the Order Head form the form doesn't open in Data Entry mode. If I change the Data Entry property on the form to Yes, it works (although I think from looking at the code that it should have been set automatically when the New Order button was clicked on the switchboard). The second problem is that once I change the Data Entry property to Yes I can't add records to the subforms (the message is that a record must be added to Order Head first).
So....something I'm doing appears to be circumventing the code that commits the record.
I'd really appreciate any help.
OrderHead Code (I cut a lot out so the message wasn't too big)
Option Compare Database ' Use database order for string comparisons.
Option Explicit ' Requires variables to be declared before they are used.
Private Sub cmdAdd_Click()
On Error GoTo Err_cmdAdd_Click
Me.cmdAdditionalPayment.Visible = False
DoCmd.GoToRecord , , acNewRec
Me.frmBridalConsultant.SetFocus
Exit_cmdAdd_Click:
Exit Sub
Err_cmdAdd_Click:
MsgBox Err.Description
Resume Exit_cmdAdd_Click
End Sub
Private Sub cmdDelete_Click()
On Error GoTo Err_cmdDelete_Click
Dim myVar As Variant
Me.cmdAdditionalPayment.Visible = False
If IsNull(Me.frmRecordStatus) _
Or IsEmpty(Me.frmRecordStatus) _
Or Me.frmRecordStatus = " " Then
myVar = OrdersCleanUp(Me.frmOrder)
Me.frmRecordStatus = "P"
Me.dspRecordStatus = "DELETED"
Me.dspRecordStatus.Visible = True
'Me.cmdDelete.Visible = False
'Me.cmdUndelete.Visible = True
Me.Refresh
Form.Repaint
MsgBox ("Order flagged as deleted . . .")
Else
If Me.frmRecordStatus = "P" _
Or Me.frmRecordStatus = "D" Then
MsgBox "Order is already flagged as deleted"
Else
End If
End If
Exit_cmdDelete_Click:
Exit Sub
Err_cmdDelete_Click:
MsgBox Err.Description
Resume Exit_cmdDelete_Click
End Sub
Private Sub cmdSave_Click()
On Error GoTo Err_cmdSave_Click
If IsNull(Me.frmReceptionDate) _
Or IsEmpty(Me.frmReceptionDate) _
Or Me.frmReceptionDate = " " Then
Else
DoCmd.DoMenuItem acFormBar, acRecordsMenu, acSaveRecord, , acMenuVer70
Me.Refresh
MsgBox ("Order saved . . .")
End If
Exit_cmdSave_Click:
Exit Sub
Err_cmdSave_Click:
MsgBox Err.Description
Resume Exit_cmdSave_Click
End Sub
Private Sub Form_Activate()
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_Activate" _
& vbCr & vbLf & "Order=" & Me![frmOrder]
Else
End If
If IsNull(Me![frmOrder]) Then
intOrder = 0
Else
intOrder = Me![frmOrder]
End If
If blnPackage Then
If Me.cmdAdditionalPayment.Visible = True Then
Me![frmTotalAdditionalPayments] = rtnTotalAdditionalPayments(intOrder)
Me![dspBalanceDue] = Me![dspTotalCharges] - Me![frmTotalAdditionalPayments]
Me.cmdMoney.Visible = True
Else
Me![frmTotalPayments] = rtnTotalPayments(intOrder)
Me![dspBalanceDue] = Me![dspTotalCharges] - Me![frmTotalPayments]
Me.cmdMoney.Visible = False
End If
Else
Me![frmTotalPayments] = rtnTotalPayments(intOrder)
Me![dspBalanceDue] = Me![dspTotalCharges] - Me![frmTotalPayments]
End If
Form.Repaint
End Sub
Private Sub Form_AfterInsert()
If IsNull(Me![frmReceptionGuests]) Then
intGuests = 0
Else
intGuests = Me![frmReceptionGuests]
End If
blnCoveringCharge = False
If IsNull(Me![frmLayers]) Then
intLayers = 0
Else
intLayers = Me![frmLayers]
End If
If IsNull(Me![frmTierSets]) _
Or Me![frmTierSets] < 1 Then
blnRaised = False
Else
blnRaised = True
End If
intLayer = 1
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_AfterInsert" _
& vbCr & vbLf & "Order=" & Me![frmOrder] _
& vbCr & vbLf & "Guests=" & Me![frmReceptionGuests] _
& vbCr & vbLf & "intLayers=" & intLayers _
& vbCr & vbLf & "blnRaised=" & blnRaised _
& vbCr & vbLf & "intLayer=" & intLayer
Else
End If
End Sub
Private Sub Form_BeforeInsert(Cancel As Integer)
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_BeforeInsert" _
& vbCr & vbLf & "Order=" & Me![Order]
Else
End If
End Sub
Private Sub Form_BeforeUpdate(Cancel As Integer)
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_BeforeUpdate"
Else
End If
End Sub
Private Sub Form_CommandExecute(ByVal Command As Variant)
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_CommandExecute"
Else
End If
End Sub
Private Sub Form_Current()
' MsgBox Me.Name & "Form_Current Order=" & Me.frmOrder
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_Current" _
& vbCr & vbLf & "Order=" & Me![Order] _
& vbCr & vbLf & "NewRecord=" & Me.NewRecord _
& vbCr & vbLf & "DataEntry=" & Me.DataEntry _
& vbCr & vbLf & "AllowAdditions=" & Me.AllowAdditions
Else
End If
If Form.DataEntry Then ' New Order
Me![dspMode] = "New Order"
'Me.dspFilter.Visible = False
Me.cmdAdd.Visible = True
Me.cmdDelete.Visible = True
Me.cmdUndelete.Visible = False
Me.cmdFilter.Visible = False
Me.cmdMoney.Visible = False
Me.cmdAdditionalPayment.Visible = False
Else ' Order Inquiry
Me![dspMode] = "Order Inquiry/Edit"
Me.AllowAdditions = False
Me.cmdAdd.Visible = False
'Me![dspFilter] = Me.Filter
'Me.dspFilter.Visible = True
Me.cmdFilter.Visible = True
If IsNull(Me.frmRecordStatus) _
Or IsEmpty(Me.frmRecordStatus) _
Or Me.frmRecordStatus = " " Then
Me.cmdDelete.Visible = True
Me.cmdUndelete.Visible = False
Me.dspRecordStatus = " "
Me.dspRecordStatus.Visible = False
Else
Me.cmdDelete.Visible = False
Me.cmdUndelete.Visible = True
Me.dspRecordStatus = "DELETED"
Me.dspRecordStatus.Visible = True
End If
End If
Me![frmHotelPackage] = Me![dspHotelPackage]
If IsNull(Me![frmHotelPackage]) Then
Me.cmdMoney.Visible = False
Me.cmdAdditionalPayment.Visible = False
Else
Me.cmdMoney.Caption = "Show Upgrades"
Me.cmdMoney.Visible = True
End If
Me![frmReceptionLocation] = Me![dspReceptionLocation]
Me![frmCakeType] = Me![dspCakeType]
If IsNull(Me![frmReceptionGuests]) Then
intGuests = 0
Else
intGuests = Me![frmReceptionGuests]
End If
Me![dspTotalCharges] = Me![frmCakePrice] _
+ Me![frmCoveringCharge] _
+ Me![frmFlowersCharge] _
+ Me![frmTieringCharge] _
+ Me![frmFlatCharge] _
+ Me![frmDeliveryCharge]
Me![dspBalanceDue] = Me![dspTotalCharges] - Me![frmTotalPayments]
If Me![frmCoveringCharge] > 0 Then
blnCoveringCharge = True
Else
blnCoveringCharge = False
End If
If IsNull(Me.TierSets) Or Me.TierSets < 1 Then
blnRaised = False
Else
blnRaised = True
End If
'MsgBox "Trap 3 blnRaised=" & blnRaised, vbInformation
intLayer = 0
End Sub
Private Sub Form_DataChange(ByVal Reason As Long)
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_DataChange" _
& vbCr & vbLf & "Reason=" & Reason
Else
End If
End Sub
Private Sub Form_Deactivate()
If gTrace Then
'gSequence = gSequence + 1
'MsgBox Me.Name & " " & gSequence & " Form_Deactivate"
Else
End If
End Sub
Private Sub Form_Delete(Cancel As Integer)
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_Delete"
Else
End If
End Sub
Private Sub Form_Filter(Cancel As Integer, FilterType As Integer)
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_Filter" _
& vbCr & vbLf & "FilterType=" & FilterType
Else
End If
End Sub
Private Sub Form_GotFocus()
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_GotFocus"
Else
End If
End Sub
Private Sub Form_Load()
If gStartup Then
Else
gTrace = True
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_Load"
End If
End Sub
Private Sub Form_LostFocus()
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_LostFocus"
Else
End If
End Sub
Private Sub Form_Open(Cancel As Integer)
On Error GoTo Err_Form_Open
Dim myFilter As String
Dim myBride As String, myCakeType As String, myPackage As String
' MsgBox Me.Name & "Form_Open Current Order=" & Me.frmOrder
If Form.DataEntry Then ' New Order
Else ' Order Inquiry
If gTrace Then
MsgBox ">>>Filter Values" _
& vbCr & vbLf & "Order=" & Forms![OrderFilter]![frmOrder] _
& vbCr & vbLf & "OrderDate=" & Forms![OrderFilter]![frmOrderDate] _
& vbCr & vbLf & "Bride=" & Forms![OrderFilter]![frmBridesLastName] _
& vbCr & vbLf & "Package=" & Forms![OrderFilter]![frmPackage] _
& vbCr & vbLf & "CakeType=" & Forms![OrderFilter]![frmCakeType] _
& vbCr & vbLf & "ReceptionDates=" & Forms![OrderFilter]![rptReceptionDateBegin] _
& "-" & Forms![OrderFilter]![rptReceptionDateEnd]
Else
End If
If Not IsNull(Forms![OrderFilter]![rptReceptionDateBegin]) Then
myFilter = "OrderHead.ReceptionDate >= #" _
& Forms!OrderFilter!rptReceptionDateBegin _
& "# And OrderHead.ReceptionDate <= #" _
& Forms!OrderFilter!rptReceptionDateEnd & "#"
Else
End If
If Not IsNull(Forms![OrderFilter]![frmOrder]) Then
If IsNumeric(Forms![OrderFilter]![frmOrder]) Then
'Me.Filter = "Order = " & Forms![OrderFilter]![frmOrder]
myFilter = "Order = " & Forms![OrderFilter]![frmOrder]
Else
'Me.Filter = "Order > 0"
myFilter = "Order > 0"
End If
Else
If IsNull(Forms![OrderFilter]![frmBridesLastName]) Then
myBride = "*"
Else
myBride = Forms![OrderFilter]![frmBridesLastName] & "*"
End If
If myFilter = "" Then
If myBride = "*" Then
myFilter = "(IsEmpty(BridesLastName) or IsNull(BridesLastName) or BridesLastName like '" & myBride & "')"
Else
myFilter = "BridesLastName like '" & myBride & "'"
End If
Else
If myBride = "*" Then
myFilter = myFilter & " and (IsEmpty(BridesLastName) or IsNull(BridesLastName) or BridesLastName like '" & myBride & "')"
Else
myFilter = myFilter & " and BridesLastName like '" & myBride & "'"
End If
End If
If IsNull(Forms![OrderFilter]![frmPackage]) Then
myPackage = "*"
Else
myPackage = Forms![OrderFilter]![frmPackage] & "*"
End If
If myFilter = "" Then
If myPackage = "*" Then
myFilter = "(IsEmpty(HotelPackage) or IsNull(HotelPackage) or HotelPackage like '" & myPackage & "')"
Else
myFilter = "HotelPackage like '" & myPackage & "'"
End If
Else
If myPackage = "*" Then
myFilter = myFilter & " and (IsEmpty(HotelPackage) or IsNull(HotelPackage) or HotelPackage like '" & myPackage & "')"
Else
myFilter = myFilter & " and HotelPackage like '" & myPackage & "'"
End If
End If
If IsNull(Forms![OrderFilter]![frmCakeType]) Then
myCakeType = "*"
Else
myCakeType = Forms![OrderFilter]![frmCakeType] & "*"
End If
If myFilter = "" Then
If myCakeType = "*" Then
myFilter = "(IsEmpty(CakeType) or IsNull(CakeType) or CakeType like '" & myCakeType & "')"
Else
myFilter = "CakeType like '" & myCakeType & "'"
End If
Else
If myCakeType = "*" Then
myFilter = myFilter & " and (IsEmpty(CakeType) or IsNull(CakeType) or CakeType like '" & myCakeType & "')"
Else
myFilter = myFilter & " and CakeType like '" & myCakeType & "'"
End If
End If
End If
Me.Filter = myFilter
Me.FilterOn = True
'Me![dspFilter] = Me.Filter
Me.OrderBy = "Order DESC"
Me.OrderByOn = True
Form.Repaint
End If
Exit_Form_Open:
Exit Sub
Err_Form_Open:
MsgBox Err.Description
Resume Exit_Form_Open
End Sub
Private Sub Form_Undo(Cancel As Integer)
If gTrace Then
gSequence = gSequence + 1
MsgBox Me.Name & " " & gSequence & " Form_Undo"
Else
End If
End Sub
Private Sub Form_Unload(Cancel As Integer)
If gTrace Then
'gSequence = gSequence + 1
'MsgBox Me.Name & " " & gSequence & " Form_Unload"
Else
End If
End Sub
Private Sub frmReceptionLocation_AfterUpdate()
Dim CurConn As New ADODB.Connection, objRSLocation As New ADODB.Recordset
Dim myReceptionLocation As String
'MsgBox Me.Name &" frmReceptionLocation_AfterUpdate", vbInformation
If IsNull(Me![frmReceptionLocation]) Then
myReceptionLocation = " "
Else
myReceptionLocation = Me![frmReceptionLocation]
End If
Me![dspReceptionLocation] = myReceptionLocation
CurConn.Open CurrentProject.Connection
objRSLocation.Open "Select * from [Location] where [Location] = '" & myReceptionLocation & "'", CurConn, adOpenKeyset, adLockOptimistic
If objRSLocation.RecordCount = 1 Then
Me![dspReceptionLocationID] = objRSLocation("LocationID")
Me![frmReceptionContact] = objRSLocation("Contact")
Me![frmReceptionContactTelephone] = objRSLocation("Telephone")
Me![frmReceptionStreetAddr1] = objRSLocation("StreetAddr1")
Me![frmReceptionStreetAddr2] = objRSLocation("StreetAddr2")
Me![frmReceptionTown] = objRSLocation("Town")
Me![frmReceptionState] = objRSLocation("State")
Me![frmReceptionZipcode] = objRSLocation("Zipcode")
Me![frmDeliveryContact] = objRSLocation("Contact")
Me![frmDeliveryContactTelephone] = objRSLocation("Telephone")
If blnPackage Then
Me![frmDeliveryCharge] = 0
Else
Me![frmDeliveryCharge] = objRSLocation("DeliveryCharge")
End If
Else
Me![frmReceptionContact] = " "
Me![frmReceptionContactTelephone] = " "
Me![frmReceptionStreetAddr1] = " "
Me![frmReceptionStreetAddr2] = " "
Me![frmReceptionTown] = " "
Me![frmReceptionState] = " "
Me![frmReceptionZipcode] = " "
Me![frmDeliveryContact] = " "
Me![frmDeliveryContactTelephone] = " "
Me![frmDeliveryCharge] = 0
End If
objRSLocation.Close
Set objRSLocation = Nothing
CurConn.Close
Set CurConn = Nothing
Me![dspTotalCharges] = Me![frmCakePrice] _
+ Me![frmCoveringCharge] _
+ Me![frmFlowersCharge] _
+ Me![frmTieringCharge] _
+ Me![frmFlatCharge] _
+ Me![frmDeliveryCharge]
Me![dspBalanceDue] = Me![dspTotalCharges] - Me![frmTotalPayments]
Form.Repaint
End Sub
Private Sub frmReceptionLocation_BeforeUpdate(Cancel As Integer)
Dim CurConn As New ADODB.Connection, objRSLocation As New ADODB.Recordset
Dim myReceptionLocation As String
'MsgBox Me.Name &" frmReceptionLocation_BeforeUpdate", vbInformation
If IsNull(Me![frmReceptionLocation]) Then
myReceptionLocation = " "
Else
myReceptionLocation = Me![frmReceptionLocation]
End If
Me![dspReceptionLocation] = myReceptionLocation
CurConn.Open CurrentProject.Connection
objRSLocation.Open "Select * from [Location] where [Location] = '" & myReceptionLocation & "'", CurConn, adOpenKeyset, adLockOptimistic
If objRSLocation.RecordCount = 1 Then
Me![dspReceptionLocationID] = objRSLocation("LocationID")
Me![frmReceptionContact] = objRSLocation("Contact")
Me![frmReceptionContactTelephone] = objRSLocation("Telephone")
Me![frmReceptionStreetAddr1] = objRSLocation("StreetAddr1")
Me![frmReceptionStreetAddr2] = objRSLocation("StreetAddr2")
Me![frmReceptionTown] = objRSLocation("Town")
Me![frmReceptionState] = objRSLocation("State")
Me![frmReceptionZipcode] = objRSLocation("Zipcode")
Me![frmDeliveryContact] = objRSLocation("Contact")
Me![frmDeliveryContactTelephone] = objRSLocation("Telephone")
If blnPackage Then
Me![frmDeliveryCharge] = 0
Else
Me![frmDeliveryCharge] = objRSLocation("DeliveryCharge")
End If
Else
Me![frmReceptionContact] = " "
Me![frmReceptionContactTelephone] = " "
Me![frmReceptionStreetAddr1] = " "
Me![frmReceptionStreetAddr2] = " "
Me![frmReceptionTown] = " "
Me![frmReceptionState] = " "
Me![frmReceptionZipcode] = " "
Me![frmDeliveryContact] = " "
Me![frmDeliveryContactTelephone] = " "
Me![frmDeliveryCharge] = 0
End If
objRSLocation.Close
Set objRSLocation = Nothing
CurConn.Close
Set CurConn = Nothing
Me![dspTotalCharges] = Me![frmCakePrice] _
+ Me![frmCoveringCharge] _
+ Me![frmFlowersCharge] _
+ Me![frmTieringCharge] _
+ Me![frmFlatCharge] _
+ Me![frmDeliveryCharge]
Me![dspBalanceDue] = Me![dspTotalCharges] - Me![frmTotalPayments]
Form.Repaint
End Sub
Private Sub frmStacked_AfterUpdate()
If IsNull(Me![frmTierSets]) _
Or Me![frmTierSets] < 1 Then
blnRaised = False
Else
blnRaised = True
End If
End Sub
Private Sub frmStacked_BeforeUpdate(Cancel As Integer)
If IsNull(Me![frmTierSets]) _
Or Me![frmTierSets] < 1 Then
blnRaised = False
Else
blnRaised = True
End If
End Sub
Private Sub cmdLocations_Click()
On Error GoTo Err_cmdLocations_Click
Dim stDocName As String
Dim stLinkCriteria As String
stDocName = "Location"
DoCmd.OpenForm stDocName, , , stLinkCriteria
Me.Refresh
Exit_cmdLocations_Click:
Exit Sub
Err_cmdLocations_Click:
MsgBox Err.Description
Resume Exit_cmdLocations_Click
End Sub
Switchboard Code
ption Compare Database ' Use database order for string comparisons.
Option Explicit ' Requires variables to be declared before they are used.
Function OpenForms(strFormName As String) As Integer
' This function is used in the onClick event of command buttons that
' open forms on the Main Switchboard. Using a function is more efficient
' than repeating the same code in multiple event procedures.
On Error GoTo Err_OpenForms
' Open specified form.
DoCmd.OpenForm strFormName
Exit_OpenForms:
Exit Function
Err_OpenForms:
MsgBox Err.Description
Resume Exit_OpenForms
End Function
Private Sub cmdNewOrder_Click()
DoCmd.OpenForm "OrderHead", , , , acFormAdd
End Sub
Private Sub cmdOrderInquiry_Click()
DoCmd.OpenForm "OrderFilter"
End Sub
Private Sub cmdReports_Click()
DoCmd.OpenForm "ReportFilter"
End Sub
Sub DisplayDatabaseWindow_Click()
On Error GoTo Err_DisplayDatabaseWindow_Click
Dim strDocName As String
' Close Main Switchboard form.
DoCmd.Close
gStartup = False
gTrace = False
gSequence = 0
' Give focus to Database window.
strDocName = "OrderHead"
DoCmd.SelectObject acTable, strDocName, True
Exit_DisplayDatabaseWindow_Click:
Exit Sub
Err_DisplayDatabaseWindow_Click:
MsgBox Err.Description
Resume Exit_DisplayDatabaseWindow_Click
End Sub
Erika
View 3 Replies
View Related
Apr 2, 2008
I have created one MS-Access application. This application will reside on server. The application will be used by many users from there local PC. I want to allow them access to only forms of application and they should not able to inerfere in database tables, queries form designing etc. How can I accomplish this task?
In short, only I should able to modify the application and all other should be able to enter the data in form and nothing else.
Please help me out...
View 9 Replies
View Related
Apr 6, 2005
I have a command button on a form, and on its onClick event i have placed the following statement in order to open a specific word document:
Call Shell("C:Program FilesMicrosoft OfficeOffice 10Winword.exe C:TempTest.doc", vbMaximizedFocus)
This works fine, however I noticed that if the path for the specific document contains a space, it does not open up successfully but i get a msgbox saying "the document name or path are not valid"
Any suggestions please ?
Thank You
View 6 Replies
View Related
Aug 14, 2005
hi.. i've developed an application in access... and i want to distribute it to some of my collegues who doesnt have an access installed in it.. can anyone please help me in doing this.. i know about runtime.. but i wanna pack my application in disks or cd...
thanks
azzy
View 2 Replies
View Related