Modules & VBA :: Unable To Get All Records By Excluding Numrows Argument In Getrows Method?
			Jul 31, 2014
				Why I am not able to get all records by excluding the Numrows argument in the getrows method?
 
Sub Test2()
Dim myrset As Recordset
Set myrset = CurrentDb.OpenRecordset("SELECT * FROM Holidays;")
myrset.MoveLast
myrset.MoveFirst
MsgBox Excel.Application.WorksheetFunction.Networkdays(#8/1/2014#, #8/31/2014#, myrset.GetRows(myrset.RecordCount))
MsgBox Excel.Application.WorksheetFunction.Networkdays(#8/1/2014#, #8/31/2014#, myrset.GetRows())
End Sub
Second MessageBox is giving a wrong value.
Is it a mandatory one? Or Do I have to do some ritual like (Movelast) before that? 
 
(Holidays table is just having the values in the array only ie. #08/15/2014# and #08/29/2014#)
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Sep 25, 2012
        
        I have a form that has several sub forms and what I want is that if the user chooses Plan Name in the main form "No Fault" or 'Workers Comp". I want message to pop and go to the field in the subform to enter data but I keep on getting an error.
 
Private Sub Plan_Name_AfterUpdate()
    If ([Plan Name] = "No Fault") Then
        MsgBox "Enter additional information in No Fault form before continuing."
    DoCmd.GoToControl ([NoFaultWCompsubForm]![Attorney Name])
    End If
End Sub
 
It says the action or method requires a control name argument?
 
What am I missing?
	View 1 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
  
    
	
    	
    	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
  
    
	
    	
    	Nov 16, 2013
        
        I have created three forms using three tables tblUser, tlbMeasure and tblSubMeasure.    The tblUser is linked to the tblMeasure table via UserLogin and tblMeasure is linked to tblSubMeasure via MeasureID.  The forms are created with frmMainMeasure being the main form and frmMeasure6 a subform and frmSubMeasure a sub with frmMeasure6.  
I want to be able to add sub measures that will be linked to each MeasureID  and each MeasureID link to each user via  UserloginID.  The forms load the data in the sub forms but when I try to add sub measures using a button I added on the frmMeasures6.  The button works when I try work on the form fine but when I try via the main form I am not able to add or view other records within the table.
When I click the Add button I want to be able to load back the same MeasureID number  in fmrSubMeasure to ensure that it is linked to the same measure and the MeasureID is linked to the same UsrrLoginID.
The code is included below and I've attached the file as well.  
Private Sub cmdAdd_Click()
If Me!frmSubMeasure.Form.Dirty = False Then
End If
Me!frmSubMeasure.SetFocus
DoCmd.GoToRecord , , acNewRec
[Code] ....
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 23, 2015
        
        I was updating my records by filling a form and entering the data's into a table but all of a sudden i couldn't add data to form and table..
	View 9 Replies
    View Related
  
    
	
    	
    	Nov 20, 2013
        
        I am working with a sub-form where once a staff member enters there sub measure I would want to create a duplicate of that record. The problem I am having is that once you enter the sub-form and click the duplicate button it creates a duplicate of the record selected but overwrites the first record in the table. I want it to create a new SubMeasure Number which is the primary key and assigns the record the next available number.
Also if I try to add another record after one has been added I get runtime error "3021" - No current record. I would have to close the form and reopen for it to be able to add again. 
I have attached the code below:
Private Sub cmdDuplicate_Click()Dim dbs As DAO.Database, Rst As DAO.Recordset
Dim F As Form
'Return Database variable pointing to current database
Set dbs = CurrentDb
Set Rst = Me.RecordsetClone
[code]....
	View 4 Replies
    View Related
  
    
	
    	
    	Feb 28, 2006
        
        Hi All,
I'm trying to extract records that start with 10 but I need to exclude all that start with 1011,1015 & 1025
so far I can only extract records that I need but cant exlude the others when I use the SQL below
INSERT INTO tblConceptOrders ( TA_TASK_ID )
SELECT dbo_F_TASKS.TA_TASK_ID
FROM dbo_F_TASKS
GROUP BY dbo_F_TASKS.TA_TASK_ID
HAVING (((dbo_F_TASKS.TA_TASK_ID) Like "10*"))
ORDER BY dbo_F_TASKS.TA_TASK_ID;
I'm looking for a better way to exclude the records I don't want & collect the ones that I do
Any help will be appreciated
thanks :)
	View 6 Replies
    View Related
  
    
	
    	
    	Feb 13, 2008
        
        Good morning,
I'm trying to create a query and I'm asking for specific records, but also need to exclude certain records within that criteria.  Here is my Select statement:
SELECT [MD IMPORT PURGE PEND].PROC, 
[MD IMPORT PURGE PEND].SEG, 
[MD IMPORT PURGE PEND].NAME, 
[MD IMPORT PURGE PEND].GROUP, 
[MD IMPORT PURGE PEND].BEN, 
[MD IMPORT PURGE PEND].DATE, 
[MD IMPORT PURGE PEND].RISK, 
[MD IMPORT PURGE PEND].REASON, 
[MD IMPORT PURGE PEND].PLAN, 
[MD IMPORT PURGE PEND].PAR, 
[MD IMPORT PURGE PEND].IND, 
[MD IMPORT PURGE PEND].REC, 
[MD IMPORT PURGE PEND].SUBNO, 
[MD IMPORT PURGE PEND].CLIENT, 
[MD IMPORT PURGE PEND].CLAIM, 
[MD IMPORT PURGE PEND].FSDT, 
[MD IMPORT PURGE PEND].PDDT, 
[MD IMPORT PURGE PEND].CHECK, 
[MD IMPORT PURGE PEND].PROV, 
[MD IMPORT PURGE PEND].SOURCE, 
[MD IMPORT PURGE PEND].PAYEE, 
[MD IMPORT PURGE PEND].EFF2, 
[MD IMPORT PURGE PEND].CSHRCNO, 
([CARR] & [CARR1] & [CARR2]) AS CPL, 
[MD IMPORT PURGE PEND].CLASS, 
[MD IMPORT PURGE PEND].MKTSEG, 
[MD IMPORT PURGE PEND].PAID
FROM [MD IMPORT PURGE PEND]
WHERE ((([MD IMPORT PURGE PEND].SEG)="CONTROL") AND 
(([MD IMPORT PURGE PEND].REASON)="44" Or ([MD IMPORT PURGE PEND].REASON)="51") AND 
(([MD IMPORT PURGE PEND].IND)="HOMES" Or ([MD IMPORT PURGE PEND].IND)="OTHER") AND 
(([MD IMPORT PURGE PEND].SOURCE)<>"IN" And ([MD IMPORT PURGE PEND].SOURCE)<>"IP") AND 
(([MD IMPORT PURGE PEND].PAYEE)="J" Or ([MD IMPORT PURGE PEND].PAYEE)="N")) OR 
((([MD IMPORT PURGE PEND].SEG)="CONTROL") AND 
(([MD IMPORT PURGE PEND].REASON)="44" Or ([MD IMPORT PURGE PEND].REASON)="51") AND 
(([MD IMPORT PURGE PEND].IND)="HOMES" Or ([MD IMPORT PURGE PEND].IND)="OTHER") AND 
(([MD IMPORT PURGE PEND].PAYEE)="S" Or ([MD IMPORT PURGE PEND].PAYEE)="M")) OR 
((([MD IMPORT PURGE PEND].SEG)="CONTROL") AND 
(([MD IMPORT PURGE PEND].REASON)="35") AND 
(([MD IMPORT PURGE PEND].IND)="HOMES" Or ([MD IMPORT PURGE PEND].IND)="OTHER") AND 
(([MD IMPORT PURGE PEND].EFF2)="3")) OR 
((([MD IMPORT PURGE PEND].SEG)="NASCO-NASCO") AND 
(([MD IMPORT PURGE PEND].REASON)="44" Or ([MD IMPORT PURGE PEND].REASON)="51") AND 
(([MD IMPORT PURGE PEND].IND)="HOSTP" Or ([MD IMPORT PURGE PEND].IND)="OTHER") AND 
(([MD IMPORT PURGE PEND].SOURCE)<>"IN" And ([MD IMPORT PURGE PEND].SOURCE)<>"IP") AND 
(([MD IMPORT PURGE PEND].PAYEE)="J" Or ([MD IMPORT PURGE PEND].PAYEE)="N")) OR 
((([MD IMPORT PURGE PEND].SEG)="NASCO-NASCO") AND 
(([MD IMPORT PURGE PEND].REASON)="44" Or ([MD IMPORT PURGE PEND].REASON)="51") AND 
(([MD IMPORT PURGE PEND].IND)="HOSTP" Or ([MD IMPORT PURGE PEND].IND)="OTHER") AND 
(([MD IMPORT PURGE PEND].PAYEE)="S" Or ([MD IMPORT PURGE PEND].PAYEE)="M")) OR 
((([MD IMPORT PURGE PEND].SEG)="NASCO-NASCO") AND 
(([MD IMPORT PURGE PEND].REASON)="35") AND 
(([MD IMPORT PURGE PEND].IND)="HOSTP" Or ([MD IMPORT PURGE PEND].IND)="OTHER") AND 
(([MD IMPORT PURGE PEND].EFF2)="3")) OR 
((([MD IMPORT PURGE PEND].SEG)="PAR") AND 
(([MD IMPORT PURGE PEND].REASON)="44" Or ([MD IMPORT PURGE PEND].REASON)="51") AND 
(([MD IMPORT PURGE PEND].IND)<>"HOSTS") AND 
(([MD IMPORT PURGE PEND].SOURCE)<>"IN" And ([MD IMPORT PURGE PEND].SOURCE)<>"IP") AND 
(([MD IMPORT PURGE PEND].PAYEE)="J" Or ([MD IMPORT PURGE PEND].PAYEE)="N")) OR 
((([MD IMPORT PURGE PEND].SEG)="PAR") AND 
(([MD IMPORT PURGE PEND].REASON)="44" Or ([MD IMPORT PURGE PEND].REASON)="51") AND 
(([MD IMPORT PURGE PEND].IND)<>"HOSTS") AND 
(([MD IMPORT PURGE PEND].PAYEE)="S" Or ([MD IMPORT PURGE PEND].PAYEE)="M")) OR 
((([MD IMPORT PURGE PEND].SEG)="PAR") AND 
(([MD IMPORT PURGE PEND].REASON)="35") AND 
(([MD IMPORT PURGE PEND].IND)<>"HOSTS") AND 
(([MD IMPORT PURGE PEND].EFF2)="3")) OR 
((([MD IMPORT PURGE PEND].REASON)<>"35" And ([MD IMPORT PURGE PEND].REASON)<>"44" And ([MD IMPORT PURGE PEND].REASON)<>"51") AND 
(([MD IMPORT PURGE PEND].IND)="HOMES") AND 
(([MD IMPORT PURGE PEND].CHECK)="000000000") AND 
(([MD IMPORT PURGE PEND].PAYEE)="S" Or ([MD IMPORT PURGE PEND].PAYEE)="M") AND 
(([MD IMPORT PURGE PEND].EFF2)="3") AND 
(([MD IMPORT PURGE PEND].CSHRCNO) Is Null));
The part in bold is the exclusion.  I want it to exclude records where the reason is 35 or 44 or 51, IND is HOMES, check number is 000000000, payee is s or m, eff2 is 3 AND cshrcno is null.  
Can anyone tell me how to achieve this?  I really appreciate your help!
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 27, 2005
        
        Hello, I'm new to the forum and relatively new to Access. There's something  I'm trying to do but I'm not sure if it's even possible so I'm hoping someone can help me out and point me in the right direction
the situation: 
I have one very big table containing data for around 250 petrol stations. The data is collected monthly, so each site has a record relating to each month. E.g site A has data for month 1, 2, 3 etc.
The problem is that in any month, some of this data needs to be excluded from analysis. And this will vary over the months. What I want to do is run a query where specific records are excluded, for example, exclude Site A data for month 1 and 3, Site B data for month 2 etc. 
I have another table containing a list of which site + month data is bad and to be excluded. Ideally I want to simply add to the list each month before I run the select query.
the question:
Is there any way to exclude records from a select query based on their details appearing on another table? 
help would be much appreciated! 
thanks
Catherine
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 28, 2008
        
        I have a split database with the back end sitting on a server.
I tried to delete two records (as i have done many times before) and now the fields are just filled with Error#.  when I try and delete them from the table one at a time it comes up with Invalid argument (Error 3001) and then Access quits on me.  I have tried everything I can think of - compact and repair, trying to copy the table, using all the fields in a make-table query to try and duplicate the table, moving the table off the server to my desktop and then trying to fix it, exporting to an Excel spreadsheet, trying a maketable query excluding these two records...but nothing works.
Any ideas at all at how I can get around this???
	View 8 Replies
    View Related
  
    
	
    	
    	Sep 8, 2006
        
        Hi
I am trying to use GetRows() function with only one field "PO_Number". The GetRows returns a 2D Variant Array. I wanted to know how to use the array. 
varPONumber = .GetRows(, , "PO_Number")
            
For j = LBound(varPONumber,1) To UBound(varPONumber,1)
                MsgBox varPONumber(j,1)
Next j
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 29, 2006
        
        I created a report where is lists sales volume by day. I was asked to create a table where data can be excluded from this report. The exclusion table consists of only three fields:
Date Department and a check box 
What do I need to do in the query to have it exclude the data listed in this exclusion table. The table only holds data we want excluded, not all dates and departments.
I originally added the table to the source query and made the criteria "False" for the check box but when the query runs it does return any data at all.
Please help!
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 20, 2005
        
        Hello all,
I'm having some difficulty obtaining the answers I want from my query. I'd have been more comfortable using filters in excel to find the answers, but my dataset is too large in this instance.
I devised a query which I thought should achieve the results, but based on a subset analysed in Excel the answers are significantly different.
My table has about thirty fields, the query I've produced is this:
SELECT AH_orphans.Product, AH_orphans.Comments, AH_orphans.ESP, AH_orphans.[ESP Parts], 
<snip, all other fields in table>
FROM AH_orphans
WHERE (((AH_orphans.ESP)="n") AND ((AH_orphans.FRU)="y") AND ((AH_orphans.EntitlementName) Like "*uptime*") AND ((AH_orphans.Account) Like "nation*") AND ((AH_orphans.Type) Like "Primar*") AND ((AH_orphans.[Is a parent?])="#n/a")) OR (((AH_orphans.ESP) Is Null) AND ((AH_orphans.FRU) Is Null) AND ((AH_orphans.EntitlementName) Like "*uptime*") AND ((AH_orphans.Account) Like "nation*") AND ((AH_orphans.Type) Like "Primar*") AND ((AH_orphans.[Is a parent?])="#n/a"));
What I'm hoping for is the subset which match the following conditions:
- ESP field is not "Y". Possible values Y, N, null
- FRU field is not "N". Possible values Y, N, null
- Only those records from EntitlementName which include the substring 'uptime'
- Only those records from Account which start with the subtring nation
- Only those records from Type which include the substring primar
- Only those records from [Is a parent?] which equal #N/A.
Asking the same questions in Excel I get around 1.5k records. If I use the quoted query on the same dataset in Access I get precisely 11.
Thanks for reading this far! If anyone can spot the flaw/s in my query, or indeed advise that I'm going at it completely the wrong way I'd be very grateful of some advice.
Cheers,
Alex
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 6, 2007
        
        Hi
I have a table that I am importing from FOXPRO DATABASE.  When someone goes into the system and deletes a record, Foxpro does not really delete the records but marks it for deletion.  There is no field to query on that I can see in the table, but when I go to Foxpro the record is "marked" for deletion.
Anyway to exclude these records when doing a query or importing the table?
Thanks
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 13, 2007
        
        Hello Query Expert
Hi I would like to exclude two specific records from my recordset.
For example suppose I have a Flights Database and I want to see all the flight records for Aircrafts 132 and 232 only, between the date jan 1, 2007 to Sep 12, 2007.
The above I know how to do achieve...
([FltNum] = 132 or [FltNum] 232)  AND ([FltDate] >= Jan 1, 2007 and [FltDate] <= Sep 12, 2007)
However, among this set of records I want to exclude flight 132 on Aug 1, 2007 and flight 232 on Sept 1, 2007.
([FltNum] = 132 or [FltNum] 232)  AND ([FltDate] >= Jan 1, 2007 AND [FltDate] <= Sep 12, 2007) AND NOT ([FltNum]=132 AND [FltDate] = Aug 1, 2007 ) AND NOT ([FltNum]=232 AND [FltDate] = Sep 1, 2007)
I haven't been able to accomplish this using the query grid.  Is it possible or do I have to write SQL?
How would you write this in SQL?
Thanks so much.
	View 4 Replies
    View Related
  
    
	
    	
    	May 3, 2013
        
        All using access 2010.  I have a query1, query2 and query3.  Query1 is my master.  Query2 and Query3 was created based on different criteria but derived from the Query1.  I now want to exclude the records from Query1 that are in Query2 and Query3.  When I try to put isnull in criteria of both queries Im trying to exclude; instead of returning the remainder records in the master I get none.  
	View 3 Replies
    View Related
  
    
	
    	
    	May 2, 2013
        
        I have a table of around 6000 records comprising 4 fields (A,B,C,D). 
- Each field can contain numbers or Nulls.
- Each record can comprise all numbers, a mixture of numbers or Nulls, or all Nulls.
 
I'd like to build a query that excludes all records that contain any number from a small list of numbers.
 
This sounds very simple but I am having problems when trying to include records that have Null's in my query output.
 
For test purposes I tried to exclude all records that contain the numbers 1 or 9 (these numbers can be present in any field).
 
This works perfectly, in isolation, on Field A (i.e. 1 or 9 but not Null are excluded from field A):
Code:
WHERE Table.A Not In (1,9) OR Table1.A Is Null;
When I try to copy the above, referencing fields B-D, I run into problems - no matter how I try to alter the Boolean operators.
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 16, 2015
        
        Trying to build a CRM system for the office but am getting stuck with the below...
Each company (tblCompany) in the database has at least 1 enquiry (tblEnquiries) linked to it and normally at least 1 (sometimes 0) people (tblPeople).
I have a form which loads company specific information e.g. notes/quotes/orders/people/enquiries. All data is loaded based on the company unique id (c_id).
The attached image shows Company 1 (c_id = 1). It has 6 enquiries. However the subform only displays 5 of these. It does not display any which do not have a person (or p_id) linked to it - this is consistent throughout the database. I have included the table relationships and the enquiry as well in case they are needed!
Searching the net seems to suggest 2 possibilities:
1 - the relationship join type needs to be set to include all from tblEnquiries and only those from tblPeople where joined fields are equal, however changing the join properties does not appear to have an effect.
2 - table field types do not match (all _ID fields are set to number, unique numbers only).
[edit]: am using Access 2010!
I have re-designed the query to pull through tblEnquiries and tblPeople data based on the c_id field on the open form, which is now showing all records, including those not assigned to a person.
However, in the form I can select one from the query datasheet and open to see additional info. Those without a blank p_id number do not open, I receive the error:
"Run-time error '2113': The value you entered isn't valid for this field.
All _id fields are set to numeric so am not sure how to correct this?
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 6, 2014
        
        I'm having a problem with argument in custom function..My table is like this:
myValues
123.5
32.7
65.8
11.1
What I want to achieve is to multiply each value with the average of all values, so that at the end I get (avg(myValues) = 233.1):
myValues2
      7196.963       
1905.593       
3834.495       
646.8525   
For this I would like to have a function (this is simplified example of bigger problem, that is why I need function, otherwise simple SQL would suffice as mentioned below also), so that I could do something like this:
'SELECT TestFn([myValues]) as myValues2 From MyTable'    or
'SELECT TestFn("[myValues]") as myValues2 From MyTable'
and I should get the table above.
My code is like this
Code:
Public Function TestFn (FieldName) as String
Dim myAvg as Double
myAvg = Davg(FieldName, "myTable")
TestFn = FieldName * myAvg
End Function
I understand the problem is that Davg needs string, but if I change to string then the multiplication does not work. The 'FieldName' parameter does not have a Type specified because that is where the problem is if I give string Avg works ,but calculation does not. If I give Number, avg does not work.
P.S. "as String" at the end of function is not a mistake, I need number as a string
P.P.S I did not inculde NZ either as in my example it can never be Null.
	View 8 Replies
    View Related
  
    
	
    	
    	Jan 13, 2015
        
        I have just added a function to a database to strip out any commas or quotation marks from a passed string.  
However, it is returning a black string even though when I step through the function it creates the out string correctly and the variable "OutString" is populated when the Exit Function command is executed.
  
 Calling code.
     InString = Btxt
    OutString = ""
    Call Strip_String(InString, OutString)
    SBtxt = OutString
    
[Code] .....
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 1, 2013
        
        1) I want to figure out how I can drop a table using "if argument". If the table exists then drop table, if not exists do something else.
 
2) I want to figure out (ALSO) how I can drop a column using "if argument". If the column exists then drop column, if not exists do something else.
  
I wrote something but is not enough..I can't find more clear information about that. 
 
Function first()
On Error GoTo Macro1_Err
Dim BD1 As Recordset
DoCmd.SetWarnings False
Set BD1 = CurrentDb.OpenRecordset("BD_example table")
 
[Code] ....
	View 8 Replies
    View Related
  
    
	
    	
    	Mar 15, 2007
        
        I'm doing this to get data from one of my queries that has at least 300 records in it. I only come up with one record each time. Why is it? I can't see the problem. Can somebody tell me? 
thanks.
Code: Dim db As DatabaseDim rs3 As RecordsetDim varconcat As VariantDim gradArray  As VariantDim strcriteria As StringDim strsql2 As StringSet db = CurrentDbDim NumRecords As Integerstrsql2 = "select * from qryTrgrds  "Set rs3 = db.OpenRecordset(strsql2, dbOpenSnapshot) gradArray = rs3.GetRows NumRecords = UBound(gradArray, 2) + 1
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 27, 2005
        
        Table1 gives Case Nu. 
Table2 gives Case Nu. and EventType.
Table3 gives EventType and Cleared (yes/no field)
I want to run a query that gives Case Nu and Event where if there is even one event marked Cleared for a Case, then that case number and its events (even those not marked cleared) don't show up at all.
Any ideas?  I know there must be an obvious solution, but my mind is stuck right now! 
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 23, 2015
        
        I want to run a query on a table that holds all speed information for our trucks imported from a third party. Some of the speed alerts in that table are not correct so we set up a second table managed by the users to enter a speed exception. So if we know that Main St in Dallas TX generates false alerts for speeding we know not to call the driver, the third party db speed limit is not up to date. 
So I want my query to pull all the speed data from tblSpeedData, except leave out the records where the street and zip are listed in the tblSpeedExceptions. 
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 12, 2014
        
        I am trying to write a query that will check all records in a table but exclude the 10 newest records in the table.
The table is from a stock program i have wrote for the company i work for (i am a novice access user). what ive been asked to do is write a duplicate order system that will flag up if the order has already been packed.
the table logs the [OrderID] with each item [barcode] scanned out with a barcode scanner what i want is a query that checks the OrderID for a duplicate entry in the entire table but because the OrderID is entered with every item scanned i want to ommit the last 10 records as prety much no order has more than 10 items i understand this may not be 100% fool proof but it is close enough. 
The other option is to have it ommit all records within the last 15 minutes there is also a [Time] and [PackDate] Field which im guessing could be used for this the time field records Now() and the PackDate records Date(). After searching the web i cant seem to find anyway to ommit the last 'n' records and the few things i have found with the Date("m",-15,Date()) doesnt seem to work 
	View 7 Replies
    View Related