Modules & VBA :: Refresh Query NOT Linked To Form Or Report
			Oct 14, 2013
				I am making a booking system where a user enters 
StartDate, EndDate (Form Header)
House , Room , UserID (Form Footer)
The Header and footer are not linked. The Footer simply displays all the existing bookings for said  ouse/Room/Date combination. (Date being all dates between the StartDate and EndDate) BUT (surprise, surprise)users don't look at this to check if a booking already exists.
Also - It seems pointless to have the users enter the same data (House, Room, UserID) in 6 times (one for each day that they want to book the room.
So I am trying to automate the process.
Therefore, I append each 'new' record (that the users adds in this session) into a temporary table. (House / Room / UserID / StartDate)....note, no end date because I need a separate record for each day.
I have a query that is supposed to check the EXISTING bookings with the temp table.
My code (paraphrased here for simplicty) says
do while StartDate < EndDate
- if Qry_CheckForClash returns 0 records then  '(uses a dlookup)
- append from TEMP to BOOKINGS.
- - else 
- compile an alert message to the user (appending the Room No and Date each iteration)
- In Qry_CheckForClash, increase the StartDate by +1
- end if
loop
My problem is that after the  last step (increase StartDate by +1) the call to Qry_CheckForClash still returns the initial StartDate. But when I check the TEMP table, the StartDate has changed.
So how do I REFRESH or REQUERY a query that is not associated to a form or report?
	
	View Replies
  
    
		
ADVERTISEMENT
    	
    	Sep 4, 2014
        
        I have MDB database linked to SQL SERVER through VPN connection.I created links to the sql server Links are dsnless..Everything works fine but when I lost VPN connection or sql connection has been broken I can't refresh links to the tables.I receive message 3146 sql connection failed..I must close database and start again...
I tried different methods like ado,dao, and vba docmd.transferdatabase,aclink... but no success, table cant be relinked.
Only way I can relink is to change ip adress in conn.string
E.g. 192.124.0.2 (1st ip- router server ip) and after connection failed i can use 192.124.0.32 (2nd ip - server local ip) and that's it if i lost connection for the 3rd time... i must restart application. 
It seems that access database keep the previous connection..how to reset or drop database connection to the sql server and refresh links to the tables with vba code without closing access database...
	View 12 Replies
    View Related
  
    
	
    	
    	Aug 31, 2014
        
        I have a form that when a user fills out the information and select a submit button. It brings up that record in reports in print preview for them to print. The issue i am having when the user enter the information, the report does not show any data until i refresh it. I tried include me.refresh,etc. No luck. I attached the code to make things simpler.
Private Sub Form_BeforeUpdate(Cancel As Integer)
  If Me.Dirty Then
  If MsgBox("Do you want to Submit this Contract Form? Clicking No will DELETE ALL ENTERIES,and Log You Off", vbYesNo, "CONTRACT FORM") = vbNo Then
        Me.Undo
        Cancel = True
  Else
  If MsgBox("PRINT FORM", vbOKOnly, "CONTRACT PRINT") = vbOK Then
  DoCmd.OpenReport "rpt_Contracts_Main", acViewReport, , "[CONTRACT_ID]=" & Me!CONTRACT_ID
End If
End If
End If
End Sub
The reports comes up, but i have to manually refresh it to show the data that was enter. 
	View 7 Replies
    View Related
  
    
	
    	
    	Jan 27, 2005
        
        I have a report that, when closed, I would like to refresh the main form, or subforms in it (Whichever is easier)
Main form: frmMain
Sub form A: subWebLCSel
Sub form B: subWebPartSel
Report: rptLabels
I tried:
forms!frmMain!subWebLCSel.form.requery- told me it cant find the field subWebLCSel
Forms!subWebLCSel.Requery - tells me it cant find the form subWebLCSel
Any ideas?
	View 7 Replies
    View Related
  
    
	
    	
    	Apr 15, 2014
        
        I have an close button on a form that is supposed to Refresh the subform of a different form and then close the form with the close button. 
 
frmOperations - no refresh / requery
subfrmPlants - Needs to be refreshed / requeried
 
frmPlants - Needs to be closed
 
Currently the button effectively closes frmPlants, but it's failing to refresh the data on my subform to display any changes that have been made on frmPlants. I've tried with refresh and requery, neither seem to work.
Code:
Private Sub lblClose_Click()
    If CurrentProject.AllForms("frmOperations").IsLoaded Then
        Forms!frmOperations!subfrmPlants.Form.Refresh
    End If
 
    DoCmd.Close acForm, "frmPlants", acSavePrompt
End Sub
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 18, 2008
        
        Hi all
I need some code to refresh/update linked tables to a data base in the same folder on startup.  Any idea how I can do this??
Thanks
Damo
	View 6 Replies
    View Related
  
    
	
    	
    	Feb 26, 2015
        
        I'm working with a form someone else created and am adding a delete button. I've managed to add the button and get some code working which will delete a record from a table. The problem I'm having is that after the delete operation occurs all fields in the form, and the corresponding items below the form, show #Deleted in all fields. How can I force a refresh using code?
	View 11 Replies
    View Related
  
    
	
    	
    	Jan 23, 2014
        
        I have a main form that the user will enter data. Once they hit a submit  button, it saves the record and I was hoping it would also refresh the  form in which is populated by a query. The form that is linked to a query  will be displayed on a monitor 24/7. It will display pending orders. So I  was hoping as new orders are placed, the query would display them  without needing to be closed and then reopened.
Here is the method I'm using but it's not working.
Code:
DoCmd.Requery "frmPDMonitor"
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 28, 2014
        
        Essentially I have a form_A with several tab's and then one list control box in each of those tabs. At present if you double click on any item within the control boxes your taken to another form_B with info about that item and when you close that from down again if refreshes form_A.
Is it possible to only refresh the specific list control box that is active instead of refreshing the whole form ?
	View 4 Replies
    View Related
  
    
	
    	
    	Apr 16, 2014
        
        Is there any possibilities to open form after INSERT INTO? I think Ms Access can't fast refresh data in the table after that, so form opens up clean:/
Code:
...
strSQL = "INSERT INTO tblZlecenia (id_zlecenia_info, DataPrzyjecia) VALUES ('" & ostateczne & "', Date())"
CurrentDb.Execute strSQL, dbFailOnError
DoCmd.OpenForm "Formularz2", WhereCondition:="ID_Zlecenia=" & ostateczne
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 28, 2014
        
        I have a form that has a check box on it.  For some reason the check box is not being checked when an update query is run prior to load. I issued the 'Me.Requery' command after the update query is run (via 'On Load' and 'On Open' in the 'Event' property  . . . neither worked) of the form.  Is this the correct way to refresh a form after an update query is run ?
	View 8 Replies
    View Related
  
    
	
    	
    	Oct 16, 2013
        
        I have a form that has a dropbox list and I want the values of the form to change according to the value in the dropbox.For example:
When the dropbox contains the value A,
The form would display x=1, y=2, z=3.
When the dropbox contains the value B,
The form would display x=4, y=5, z=6.
I managed to create a query that opens the QUERY's results according to the value in the dropbox but I can't managed to run the query in the form, return the values according to the query and display them in the form.
I searched the internet and found many options including the Dcount command but I don't think it fits my case..I know I have to write something in the AfterUpdate field of the dropbox but I just can't figure out what it is...
	View 8 Replies
    View Related
  
    
	
    	
    	May 11, 2015
        
        How do i create a report that is linked to my sub-form that i have just sorted in a different form? let's say i have a form named View Records and on that form i have added a subform that is linked to my Employee Table, and then on that View records form i have added a few combo box in order to sort the data on my subform on that form, now what i want to do is that, i want to link those data that i just sorted on my subform and transfer it to a report.
	View 5 Replies
    View Related
  
    
	
    	
    	Aug 30, 2013
        
        I have a query that populates a report linked to a mail merge.  There is an IFF statement in it that checks to see if a condition is meet.  If that condition is meet some standard text results.  Is it possible to put a disclaimer with the standard text.For example,  
Code:
 IIF ([Results]="Negative","Nothing detected" (the disclamer would go here)
I am not certain the correct syntax to use to insert "not all regions were tested". 
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 22, 2013
        
        My report produces multiple copies of the same record.  I know why, but don't know how to fix it.
 
EmployeeTable.
 
With a one to many relationship with TrainingTable (via employee PK as FK in trainingtable).
 
Training table has a one to many relationship with a table called Range.
 
Report is based on a query that picks up the Employee/Training/Range (range just describes the training unit).
 
However, If I have more than one range expressed organized a training unit, the report spits out several copies of the Employee record to display all the ranges.
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 22, 2015
        
        I have linked tables from SQL Server using ODBC connection that their location never changes.  I have used certain fields of those tables to create queries and make table queries to derive to the information I needed.
On these tables on SQL Server, there is new data added daily.  Every day, midnight, there's new data records added of whatever transactions took place in that working day. how often do I need to refresh linked tables in this case to get the latest data added.  I mean, once I am linked, the make table query using those defined fields, would it get the latest data added by default when the query is executed, or I must refresh linked tables using Linked Table Manager and then run make table query.
Also, if I want the access to automatically refresh linked tables, can I use the following code?  I have added this code, and executing it through a button, but I don't see anything happen, the database becomes inactive for couple seconds (I guess while it is updating) but I don't know is it updating the tables for sure or not, though I am not receiving any error when executing the code through the button.
Function RefreshLinkedTables()
Dim tdf As TableDef
For Each tdf In CurrentDb.TableDefs
  If Len(tdf.Connect) > 0 Then
    tdf.RefreshLink
  End If
Next td
End Function
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 26, 2014
        
        I have a file "MatchingData" thats linked to another file "Clist" . What I'm looking for to open "MatchingData" and update from "Clist" on opening. I don't know if I can do this without opening "CList". I have a feeling that I may have to open the "CList" (Hidden), update,then close "CList".
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 16, 2013
        
        I have a Multiple Value Combobox that I  have linked to one of my forms and I am trying to write some vba code  that will allow on update, "if a certain item is clicked open up a  different form". 
Here is the Multiple Value Combobox Multiple value combobox3.JPG 
Here is the formFormaccess.JPG.
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 26, 2013
        
        I am working on making a DB to use as a production schedule. tblBuilds holds a list of builds. I have several reports to show this list with different filters. One such report is rptBuildsToday. This report will be open on the production warehouse computer and displayed on a huge screen all day every day. 
Is it possible to make it so this report auto runs again every so often? When new builds are added to tblBuilds, or if a record on the table has its date changed to "today", It would be nice to have the report reflect this change within a certain time without having to manually refresh the report. The people looking at the screen will be doing so from their work benches and nowhere near the computer that has it opened.
If this is indeed possible, could the proposed method also work on a report or form inside the tab of a navigation control?
	View 7 Replies
    View Related
  
    
	
    	
    	Mar 28, 2005
        
        This should be fairly simple, but it is driving me nuts trying to get it to work right.  I feel like I'm chasing my tail.
Anyway, I have a query with three fields:  "PersonnelID", "QualificationID", and "QualificationStatus".  This is a query off of my large table for tracking qualifications; however, I am using a form with three combo-boxes for the same information.  The first two combo-boxes (personnelID and QualificationID) are used to filter the query.  This gives the result of one and ONLY one row in the query.  A unique personnelID number, a qualificationID number and the qualification status of the record in question.  I WANT to be able to automatically retreive the last field (qualificationStatus) from the query and display in the form (and then save in my new table - I know, shouldn't save calculations and such). 
I have it working somewhat.  I can select the first two combo-box fields and then when I click the third combobox for qualificationstatus, I only have one item in the dropdown menu and then I select it.  So far, so good, but this only works for the first record that I am working on.  If I do another record without closing the form first, the combobox selection for qualificationstatus still shows the previous entry.  However, if I switch the form to design mode and then back to form mode, the combobox shows the correct value.  I just can't seem to get the form to refresh prior to selecting the third combobox.  I have tried "DoCmd.RepaintObject" after update on the second box and on focus for the the third box, but it still doesn't work unless I switch the views back and forth.
Any suggestions would be ever so gratefully appreciated...
Brian :eek:
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 10, 2013
        
        I have a form, containing a button that when clicked, it runs a query and displays the results in Pivot Table view.  The query is set to display only results for the manager name selected on the form.  So, when someone opens this database, they first select their name from a drop down box and then click the button to run the query.  The query displays average call rate for equipment that person is responsible for.  The only problem I am having is that if someone goes back to the main form, selects a different name, and clicks the button again, the query will not refresh.  The query won't even refresh when I click the Refresh All button in the Ribbon.  In order for the query to update, I have to first click the button to refresh the pivot table and then click the button to refresh the query.  Is there a way to do these two steps through visual basic, so that the user doesn't have to do those two extra steps?
Right now, I am using the Docmd.OpenQuery code on my button. 
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 26, 2015
        
        I want to call commandbutton1,2,3 after every 10 seconds automatically but following code doesn't do that. 
Code:
Private Sub UserForm_Initialize()
'Update the Barcodes printed today
        Call CommandButton1_Click
        'Update batches to be scanned / batches scanned today
        Call CommandButton3_Click
        'Update files batched and counted today
        Call CommandButton2_Click
Application.OnTime Now + TimeValue("00:00:00"), "GoToSub"
      End Sub
 
[code]....
	View 7 Replies
    View Related
  
    
	
    	
    	Aug 9, 2013
        
        I have a typical Access 2007 database with a main form that has combo boxes that are populated by other tables. To edit or add to the combo boxes I have separate forms. When I make the changes I want the combo boxes to be refreshed. I would imagine I can do it with a FormName.Refresh command. However, I am curious if there is a command to refresh all forms and reports in case I have more than one form open with combo boxes that link to the changed data.
	View 11 Replies
    View Related
  
    
	
    	
    	Dec 20, 2005
        
        Hello,
I am a relative newby to Access, Can someone please offer a solution to my problem.
I have a DB which lists current order references, I also have a linked spreadsheet from a customer which references their Ref number to our S/order no & Item no.
I have set up the relationships for the common data between both tables.
if I create a Query from either table individually the data can be edited but when a query is created from both sources the data cannot be edited.
this also happens if the spreadsheet is imported to its own DB.
I would really like to create a form which displays both sets of data for editing, marking progress etc.
Can data from linked tables be edited in a form ?
Regards
Andy
	View 6 Replies
    View Related
  
    
	
    	
    	May 4, 2006
        
        I've been looking around and have found some posts that pointed me in the right direction, I just can't get it to work.  What I have is 37 excel files of competitor cross references.  There are 2 columns in each excel file, our number and their number.  I have inserted them as a linked table in the db.  What I want to do is create a form that has a field for every part number and make all of those fields a search field.  That way they can type in any number and get all numbers back.  I have created a query but once I get past 4 linked excel sheets then I get errors about a type mismatch in expression.  Also I can't get the form fields referencing the query to show up when I open it.  If I leave the query at 2 or 3 fields and use [Forms]![CrossRef]![txtItemNumber] in the criteria of our number in the query, it works.  I get a window that pops up when I just open the query asking for a number, I type it in and the query returns the number and competitor numbers.  Am I doing this the hard way??  Thanks for any ideas...
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 14, 2005
        
        Please can you help me find the issue to my problem that is probably hitting me in the face.
I have an unbound form to which i use an append query to post the data from the fields on the form to a table.
The table is set up very simple and has a primary key which i will never duplicate as you would expect.
Once i have inputted one lot of data into the form the command button runs the query and the data is posted to the table fine. The problem i am having is that the second lot of information i go to append the query refuses to add.
I get the validation rule violations error and it won't post the data.
If i close out of the form, open it again and input the same information the query adds it fine and again the second lot you get the error message.
i had this problem before but for the love of me cannot remember how i resolved it. I have had to keep closing the form after each entry to post the information.
Any help much appreciated.
	View 2 Replies
    View Related