Modules & VBA :: Recordset Loop Skipping Entry?
			Jun 26, 2015
				I have 2 identical tables of asset information. Table 1 has 251 records while table 2 has 84 records. All 84 records are in table 1 right now. My end goal is to be able to click a button, have vba script run, and table 2 updates table 1 with any changes from different fields. I know there are merging options with query and what not but the exact structure of my tables doesnt play well with it. 
Right now, my code is able to loop through the values of each computername and display it. For some reason, when it gets to the 130th record of table one, the loop skips it and returns the 131st record, it stays one ahead for the rest of the loop and then prints the 130th record finally. 
Since I am trying to compare field values, this sudden shift throws everything off. why it skips?
Code:
Option Compare Database
Private Sub UpdateAssetsBTN_Click()
On Error GoTo Err_Proc
Dim rs1 As DAO.Recordset
Dim rs2 As DAO.Recordset
[code]....
	
	View Replies
  
    
		
ADVERTISEMENT
    	
    	Jun 4, 2014
        
        Is there a way of looping through a non update able continuous subform, and using information from each line. 
Which creates a new record in another table? so if there are 3 records in the subform it creates 3 new records in the other table and so on?
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 16, 2014
        
        Im trying to create a record set that compares a quantity value in the recordset to a Value in a temporary table that holds the most recent remaining quantity. I have the following code in the after update of a text box, but it does not trigger. I want it to run after a value is entered into the text box. Is the code wrong or the location im putting it incorrect?
Code:
Private Sub txtQty_AfterUpdate()
Dim rs As DAO.Recordset
DoCmd.OpenQuery "qryQuantitySoFar"
Set rs = Forms!frmReceive!sfrmReceiveDetailEntry.Form.RecordsetClone
[Code] ....
	View 11 Replies
    View Related
  
    
	
    	
    	Aug 2, 2013
        
        I have this code (below) that loops through a recordset and sends appointments. It executes the queries correctly and sends all appointments in the table, but sends them only to the contacts listed in the first record of the query. How do I get it to loop the contact details? 
Code:
Private Sub SchedFollowUp()
Dim rsFollow As DAO.Recordset
Set rsFollow = CurrentDb.OpenRecordset("SELECT * FROM Follow_Up WHERE HR_Approved = True AND Added_to_Outlook = False AND Cancelled = False;", dbOpenDynaset)
Dim rsEmployee As DAO.Recordset
[Code] ....
	View 10 Replies
    View Related
  
    
	
    	
    	May 8, 2014
        
        I am attempting to use 2 fields from a query to supply the Top and Left Properties of a Collection of Rectangle Controls on my form.  The purpose of this is to display the locations on a map of "Spots" in a haunted house.  The query that I am using shows the spots that have been pre-tagged with the location of where they belong on the map (currently the query has only 24 tagged spots).  On the actual form I have rectangle controls (control type acRectangle) with their visible property set to False by default, named box1 through box25 (there will be more eventually, as I am just working with this test group). 
I started with the following code, yet it stops after (correctly) placing the first spot on the map (please see the attached jpg):
Code:
Private Sub Form_Open(Cancel As Integer)
Dim ctl As Control
Dim db As DAO.Database
Dim rst As DAO.Recordset
[Code]....
I'm sure I need to have 'Loop' in there somewhere, but I am not sure exactly where to place it, or if another line is also needed.
	View 10 Replies
    View Related
  
    
	
    	
    	Jun 9, 2014
        
        Is there a way of looping through a form record set, while adding new records to a different form record set? using some data from the 1st record set in the new records? 
	View 8 Replies
    View Related
  
    
	
    	
    	Aug 27, 2014
        
        So I have a table "zztblArticles." Some fields should go to "tblArticles" and values in Tag_ID should go to a lookup table "tblTag" and a junction table "tblArticles_Tags." I'll explain the code I've written below:
Code:
Private Sub cmdSubmit_Click()
    
    Dim db As Database
    Dim strINSERT As String
    Dim strVALUES As String
    Dim rszztblArticles As DAO.Recordset
    
[Code] ....
The first loop through works fine, I get the records uploaded to all tables. The second loop through fails at
Code:
intArticleID = DLookup("ID", "tblArticles", "Sourcing_Date = " & !Sourcing_Date)
Because it can't decide which ID value to use. This is because the value has been duplicated in tblArticles after the code acts on the same record again. It has completely failed to move to the next record in the recordset, despite the .MoveNext before the Loop!  
	View 12 Replies
    View Related
  
    
	
    	
    	Jul 22, 2014
        
        In my database, I have a continuous form with a Name, a Date and a Yes/No field.
 
When the form opens, I want to look at the date of every record on the form and show a message box if it is before the current day.
 
The code I have is this;
 
Private Sub Form_Load()
    With Me.RecordsetClone
        While Not .EOF
            If Me.Date1 < Date Then
                MsgBox "" & Me.Person & ""
            End If
            If Not .EOF Then .MoveNext
        Wend
    End With
End Sub
However, it loops just the first record the amount of times there is of records (i.e., it will only show the first person's name in the message box, and will show 3 times if there are 3 records).
	View 7 Replies
    View Related
  
    
	
    	
    	Aug 17, 2015
        
        managed to get some code up and running but when trying to enhance it I have hit a rut.
I have a function that is looking up a query called Optimisation - Auto Optimise with operational data in it. I only need 2 key fields; consolcode and volume. There are 106 records with different consolcodes each with different volume. e.g consolcode: Chittagong to Rotterdam201452 (Chittagong to Rotterdam by year "2014" by week "52") and volume 161 (cbm)
I then run a code that allocates the volume into specific sea freight containers and returns the values into a different output table.
The allocation code works fine but when I run the loop function for the recordset rsttradelane it runs for the correct amount of records (106) but always returns the first record of Chittagong to Rotterdam201452 and 161 cbm and not the other 105 consolcodes with the different cbm. Giving me an output table with Chittagong to Rotterdam201452 and 161 cbm repeated 105 times!!
Code:
Set rsttradelane = dbsEPIC.OpenRecordset("Optimisation - Auto Optimise")
consollane = rsttradelane!consolcode
ConsolVol = rsttradelane!Volume
 Do Until rsttradelane.EOF
'Optimisation code' then 
Code:
rsttradelane.MoveNext
Loop
  rsttradelane.Close
How do I ensure that each consolcode and its associated cbm is recognised individually and flushed through the optimisation code?
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 13, 2014
        
        I found this code and have substituted parameters to suit my own needs however the loop is not working. Only the first record in my recordset (which is a test recordset of only 3 records) is being updated.
Also, for testing only, the edit or update being applied is trivial: Description = "WHITE RESIN".  If i can get the loop to work I want to substitute higher functionality to the module.
Private Sub Update_Click()
Dim dbs As DAO.Database
Dim rsQuery As DAO.Recordset
Set dbs = CurrentDb
Set rsQuery = dbs.OpenRecordset("qryRmResin", dbOpenDynaset)
[Code] .....
	View 14 Replies
    View Related
  
    
	
    	
    	Jul 8, 2015
        
        I have some code that loops the clone recordset of my subform and generates a email with attachments. I have mainform and continuous subform within the subform I have field called address this holds paths to files and another field called send and this is a yes/no field 
  
Now what I'm trying to do is loop through the subform if send field is true then attach file from the address path but if send field is false then do not attach file 
  
Code:
Dim olApp       As Outlook.Application
    Dim olMail      As Outlook.MailItem
    Dim olAttach    As Outlook.Attachment
    Dim rstAttach   As DAO.Recordset
     
    Set olApp = New Outlook.Application
    Set olMail = olApp.CreateItem(olMailItem)
  
[Code] ....
	View 14 Replies
    View Related
  
    
	
    	
    	Dec 9, 2014
        
        I have this code here that sends an email out with all the needed info. The problem i ran into was that for my field "item" it is in a table called "test" and there can be more than one record in there. I just can't get it to loop and show me all of the records. Right now it shows me only the first record. Also it is showing the name of the table before the result so i am not sure what is wrong there...
Code:
Private Sub Command4_Click()
On Error GoTo Err_SendInfo_Click
    Dim varTo As Variant
    Dim varCC As Variant
    Dim stSubject As String
[Code] ....
	View 4 Replies
    View Related
  
    
	
    	
    	Nov 21, 2006
        
        I have a main form with several continuous subforms.  Each subform consists of several listbox controls.  I would like to require the user to select an item from the listbox before being allowed to move to the next record in the subform, and upon reaching the last record in that continuous subform, to require an entry there in order to move to the first record in the next cont. subform.  
As an added bonus, it would be nice, though not necessary, to automatically jump the focus from one record to the next after data is entered.  But my basic goal is to avoid skipping records.  
Caveat:  I cannot use the "required" option in the field to which the control is bound because that field has a default value previously entered using an append query.  (The default value basically means "not yet entered" and is not one of the options in the listbox.  I am using this because this field is a foreign key in the table, thus it must have a value in order to have a record with which to populate the subform.)
My apologies if this has been asked and answered elsewhere, but I've searched and, while I found a few related threads, they don't quite answer my question.  Here they are for reference:
http://www.access-programmers.co.uk/forums/showthread.php?t=38364
http://www.access-programmers.co.uk/forums/showthread.php?t=69047
http://www.access-programmers.co.uk/forums/showthread.php?t=103176
Thanks for any help!  Also, if you are going to recommend VB code, could you be specific about how and where I should use it?  I'm not afraid of code, but I'm definitely new to it...
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 25, 2006
        
        Hi folks,
I have created a recordset and what i want to do is check the field value "SiteRAG" to see if it matches some criteria and if so do some action where the field "SiteID" = the same as a label on a form.
Please see CAPS in middle of code:
Dim db As Object
    Dim rs As Object
    Dim intCount As Integer, intRecordCount As Integer, intID As Integer
    Dim strSQL As String
    Dim strRAG As Long
    Dim fldItem As Field
    strSQL = "SELECT tblSite.SiteID, tblSite.SiteRAG, tblSite.Active " _
    & " FROM tblSite " _
    & " WHERE (((tblSite.Active)=Yes));"
    
    Set db = CurrentDb
    Set rs = db.OpenRecordset(strSQL)
    
    intRecordCount = 0
    rs.MoveFirst
    
    CHECK THE FIRST ROW FIELD SiteRAG & IF = TO CRITERIA THEN
    DO SOMETHING BASED ON A LABEL MATCHING THE SiteID
    ELSE 
    MOVE TO NEXT ROW
    
    Loop
    rs.Close
    db.Close
Thanks for any help
Mark
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 18, 2013
        
        I have a following problem: I have a form in continuous mode. Users are supposed to filter data in it to their liking using inbuild filters in Access. After that there is a button that should calculate total weights in filtered records (at this point, I add more calculations once I have solved this issue). Code of button is as follows:
Code:
Private Sub btnCalculateWeight_Click()
    Dim rst As Recordset
    Dim weight As Long
    Dim material As Long
    Dim subtype As Long
    Dim locus As Long
[Code] ....
Loop goes through recordset correct amount of times but for unknown reason takes value only from the first record and sums it N times where N is number of records in recordset. Recordset seems to be correctly assigned according to messageboxes I added to pinpoint problem. PotteryWeights is a custom function I made and it works properly. 
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 27, 2014
        
        My application crashes when trying to change the value of a text box in a continuous form. Here is the code:
Code:
Private Sub cboPoCurrency_AfterUpdate()
On Error GoTo ErrHandler
    Dim rst As Recordset
[Code].....
If I replace .txtUnitCost by MsgBox .txtUnitCost, it loops correctly through each record and returns the value. But if I try to change the value as shown in above code, MS Access crashes! (This is a desktop application with tables linked to SP lists - not a web app)
[URL]
	View 14 Replies
    View Related
  
    
	
    	
    	Sep 3, 2014
        
        In attached file i am updating the YU field in YABANCI_UYRUKLULAR table where CALISMA_IZIN_NO fields is matching from YU table. But there is a problem after update i see one of the record's YU field is 10 character, it must be 11 character as in the YU table. 
	View 11 Replies
    View Related
  
    
	
    	
    	Oct 8, 2013
        
        I'm working on a code that checks all blank/null text fields and combo boxes in a form and notifies the user if a field is not filled.  The code below works if all fields are required, but I can't use it on forms that have fields that are not really mandatory.  I've read somewhere on the net to use tags on the controls i want to skip checking, but that's where i get lost.  
Code:
Dim stdResponse As Variant
Dim ctl As Control
    ' Enumerate Controls collection.
    For Each ctl In Me.Controls
        ' Check to see if control is text box
[Code] .....
	View 8 Replies
    View Related
  
    
	
    	
    	Mar 12, 2015
        
        I have two tables, tblCandidate and tblNewHire.  I am trying to transfer candidates to tblNewHire based on the date they are hired.  However, I would like the database to skip any records that are already in tblNewHire, just in case someone inadvertently puts in the wrong date when running the query.
I created an append query (SQL below) but this enters the data regardless of duplication.  I need to be able to check both SSN and LastName against the new table and can't set either one to be unique values as it's possible there could be two candidates with the same last name.
 
Any way to do this by creating a recordset and looping through to check for dupes.
 
INSERT INTO tblNewHire ( SSN, FirstName, MiddleName, LastName, Phone, Email, EOD, HiringMechanism )
SELECT tblCandidate.SSN, tblCandidate.FirstName, tblCandidate.MiddleName, tblCandidate.LastName, tblCandidate.Phone, tblCandidate.Email, tblCandidateTracking.ActionDate, tblCandidateTracking.HireMechanism
FROM tblCandidate INNER JOIN tblCandidateTracking ON tblCandidate.SSN = tblCandidateTracking.SSN
WHERE (((tblCandidateTracking.ActionDate)=[forms]![frmNewHireMain]![txtEODDate]) AND ((tblCandidateTracking.LastAction)="EOD"));
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 14, 2015
        
        Special situation: The SQL Server Linked Server across the country is linked to a Read Only Oracle DB. This data pull works perfectly and populates the Subform. 
The problem is that Oracle can take 3 to 6 seconds to retrieve the single record depending on the network traffic through a small pipe.
 
The code below shows the RecordSource for the SubForm. clicking on a list box supplies the value. Then 3 to 6 seconds later, the subform populates.
 
The actual Recordset for this Recordsource is needed to conduct Validation on each field. Normally this would be on SQL Server, I might just create a Recordset Oject and run this SQL statement again in 1 milisecond. In this case, it will probably take an additional 3 to 6 seconds. Avoiding another lengthy round-trip to Oracle would be prefered.
 
Goal: How does one grab, clone, or other wise reference the existing recordset for the SubForm?
Note: Immediate Window - One single field can be returned quickly 
There are 48 fields that need validation - is there a way to reference the entire recordset?
Immediate Window during Break Mode:
? me.fsubsrNavSHLBHL("NavSH_QQ")
NESE   ' this is the correct value for the current recordsource
  
Set a breakpoint right after the line:
fsubsrNavSHLBHL.Form.RecordSource = "Select * from vsrNavigatorSHLBHL where Well_ID =" & txtNavWellID.Value
 
Immediate Window:
? me.fsubsrNavSHLBHL.Form.RecordSource
Select * from vsrNavigatorSHLBHL where Well_ID =91229
	View 4 Replies
    View Related
  
    
	
    	
    	Nov 25, 2005
        
        hi
i am trying to write a query to produce a descending recordset of photo_id but only one from each user e.g
if these are the top records
photo_id 150 m_name dave
photo_id 149 m_name dave
photo_id 148 m_name dave
photo_id 147 m_name john
photo_id 146 m_name john
photo_id 145 m_name fred
i want the query to produce this
photo_id 150 m_name dave
photo_id 147 m_name john
photo_id 145 m_name fred
and so on, there are other fields also but that gives you the idea i hope.
what i have come up with is this
SELECT MAX(FORUM_ALBUM.Photo_id) AS ID, FORUM_ALBUM.Photo_Name,FORUM_ALBUM_USERS.M_Name,FO RUM_ALBUM.Member_id
FROM FORUM_ALBUM, FORUM_ALBUM_USERS
WHERE FORUM_ALBUM.Member_id=FORUM_ALBUM_USERS.MEMBER_ID AND FORUM_ALBUM.Photo_Status=1 
GROUP BY FORUM_ALBUM.Photo_id,FORUM_ALBUM.Photo_Name, FORUM_ALBUM_USERS.M_Name, FORUM_ALBUM.Member_id
ORDER BY FORUM_ALBUM.Photo_id DESC;
this gives me the records i want in the correct order but it gives multiple instances of each M_Name instead of just one record for each M_Name
i hope i have explained this clearly enough
thanks
Dave
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 7, 2013
        
        I want to write a email where there are 2 or 3 different ordernumbers  for same email, i want to include the email in the mail part as single  column table. how to do it? also can i use result of one recordset for other recordset?
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 1, 2014
        
        Code:
 
Private Sub Consolidate_Click()
Dim temp As Variant
Excel.Application.Visible = True
temp = Dir(CurrentProject.Path & "Inputs")
Do While temp <> vbNullString
[Code] ....
From the second iteration its not picking the error. 
	View 5 Replies
    View Related
  
    
	
    	
    	Mar 11, 2014
        
        I have to loop thru 2 recordsets.I need to first determine the quarter , then retrieve a value from each of the 6 fields for that quarter and compare that value against a previous years value that is also stored in the table for each quarter.the following is the field names not the field value.
Tier           1       2         3        4         5        6      PrYr
Qtr1      Q1T1, Q1T2, Q1T3,Q1T4, Q1T5, Q1T6          .385
Qtr2      Q2T1, Q2T2, Q2T3.Q2T4, Q2T5, Q2T6          1.25
Qtr3      Q3T1, Q3T2, Q3T3,Q3T4, Q3T5, Q3T6          .774
Qtr4      Q4T1, Q4T2, Q4T3,Q4T4, Q4T5, Q4T6          .333
if Qtr1 =  Q1T1 = 0.44 Q1T2 = .50, Q1T3 = 1.45, Q1T4 = 3.00, Q1T5 = .25, Q1T6 = 6.0
So I need to be able to set the value of PrYR = .385 and compare against the value of the 1st qtr for each tier for Qtr1.Then go to Qtr2 and repeat the process but grap the Q2 PRYR value = 1.25 and compare against all Tiers for Qtr2.As so forth for each quarter.then I need to compare the value of the PrYr and if it is the following then
If PctYrlyIncrease< Tier1 Pct (Q1T1) Payout = 0
elseIf PctYrlyIncrease> Tier1 Pct (Q1T1) and <  Q1T2 then
Sum(TotalNetUSExp * T1E)
ElseIf PctYrlyIncrease> Tier2 Pct (Q1T2) and <  Q1T3 then
Sum( TotalNetUSExp * T2E)
and repeat for each Tier per Each Qtr.Here is my code so far:
Code:
Public Function BkOvrCalc(ByVal gContractID As String) As Long
Dim curDB As DAO.Database
Dim strSQL As String, strSQL1 As String
[code]...
	View 3 Replies
    View Related
  
    
	
    	
    	May 11, 2014
        
        Here is the code:
  
 Private Sub Form_Load()
Dim rs As Recordset
Set rs = CurrentDb.OpenRecordset("select * from tblpatient, dbOpenDynaset)
  If Not (rs.BOF And rs.EOF) Then
   rs.MoveFirst
    Do While Not rs.EOF
       '    do stuff
        rs.MoveNext
    Loop
    rs.Close
    Set rs = Nothing
End If
 End Sub
  
 I have watched it step through on debug and it does everything right for the first record, but it seems to come back to the same record.
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 23, 2014
        
        I have a form where a textbox has shows the NameNo from the NameNo column in a db. At the moment I am using a dlookup to set the textbox = to the NameNo, but obviously this is only returning the 1st value in the column. How to get this form to automatically display each NameNo, creating a pdf of the form and then moving on tto the next nameno. I have the code to make the pdf working so far, all I need now is to figure out how to use the textbox to loop through all the NameNo's in the table.
	View 3 Replies
    View Related