Modules & VBA :: Create Recordset From List Box
			Sep 3, 2014
				Is it possible to create a record set from a list box?
I have two list boxes list1 (customers) the can transfer records to list2. I want to take all records from list2 and use it to open a report, using customer id as where clause in my docmd.openreport statement.
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Aug 21, 2013
        
        As I am moving through my code, I'd like there to be a pop-up box which asks the user to choose from a list of dates. This list of dates only resides in a filtered recordset in the background. 
Once the date is chosen, then my code continues onward..I know I could make some sort of pop-up form, but I'd rather not have to go in a design all that just for a list of dates...
1) Is there such a thing as a dropdown list on a Input box? 
and even if there isn't...
2) Is there a way I can bind the column in a recordset to a dropdown list?
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 17, 2014
        
        I have some code that takes from a query, an email address and sends out an email.Due the security warning that happens for each individual email, i want to create ONE email for all email address in the query and populate them to the BCC section of the sendobject.Here is the code that I currently use
Code:
Private Sub cmdSendEmail_Click()
Dim MyDB As DAO.Database
Dim rsEmail As DAO.Recordset
Dim sToName As String
Dim sSubject As String
Dim sMessageBody As String
 
[code]...
I want to populate the BCC field with multiple emails addresses seperated by ":" and send just one email.
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 22, 2013
        
        I have the listbox named "payment_date", which shows recordset specified by following code:
Code:
Private sub Form_Current()
Dim que As String
que = "SELECT [date] FROM payments WHERE id Like '" & Me!myid & "*' ORDER BY [date] desc;"
Me.payment_date.RowSource = que
End Sub
I need my listbox to show recordset with record count like this:
3.date
2.date
1.date
	View 4 Replies
    View Related
  
    
	
    	
    	Jul 5, 2013
        
        I have a spread sheet which on a per line basis contains columns whose cells contain the path to a file. It looks as if many of the files are tif, pdf, word and excel etc, so multiple file types.
 
Writing a routine which would take each row and then for each line of file paths turn them into one multi-page document - pdf or something?
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 18, 2013
        
        I'm using Access 2007.
So far I have a Multi Select enabled list on which the user selects the serial numbers they want. They then click the "Report" button which will trigger a query based on the selected serial numbers to create a report on those serial numbers.
I have the code for the multi-select list working already. It creates a string of comma separated values that are the serial numbers which are selected in the list. Somehow I need to pass this string to my query so it can  use it as a filter.
Here is some of my code:
Code:
Option Compare Database
Option Explicit
Private Sub Form_Current()
    Dim oItem As Variant
    Dim bFound As Boolean
[Code] ....
Here's my current query in SQL:
Then finally how to I get the query to execute and create a report based on all of this?
	View 11 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
  
    
	
    	
    	Aug 17, 2007
        
        from a table with fields userID and Date (in which any userID has multiple records with different Date values, and other fields) i have built a select query based on Date = one specific value. can anyone give an explanation (for beginners), through a sample code, that expands the query recordset so that the new recordset includes all records per userID that qualified in the prior recordset? below is an example. thank you!
Table with records:
userID / Date
u1 / d1
u1 / d2
u2 / d1
u2 / d2
u3 / d2
...
1st Select Query (where Date = d1):
u1 / d1
u2 / d1
Desired 2nd Query based off 1st Query (where ?):
u1 / d1
u1 / d2
u2 / d1
u2 / d2
	View 3 Replies
    View Related
  
    
	
    	
    	Jan 17, 2005
        
        What is the easiest way to get the results from a query?
I now create an empty form and set the sql-statement as the recordsource, but this means I can't open two forms simultaniously because they use the same subform.
I know how to creat an ado-recordset, but this would mean the client needs to install extra dll's, my client doesn't have those (I want the program to work on a pc that has access installed and nothing more).
 
There must be an easier way...
 
Another problem I have is that when access is closed the MSACCESS proces keeps running, is this a bug, can I have caused this?
 
With any other access file this is not the case, but they do not have an autoexec.
 
Please help
Yvonne
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 27, 2007
        
        Hi, 
I'm trying to create a new table from another existing two in vba. I'm using this code without success... Any help will be gratefully taken.
---------------------
Dim strSQL as string
Dim tablaSuma As DAO.TableDef
Dim rst As DAO.Recordset
strSQL = "SELECT * FROM Necesidades_TRS1, Pedidos WHERE Pedidos.Código=Necesidades_TRS1.Código"
Set rst = CurrentDb.OpenRecordset(strSQL, dbOpenDynaset)
Set tablaSuma = CurrentDb.CreateTableDef("TablaSum")
For Each Campo In rst.Fields
    tablaSuma.CreateField(Campo.Name, DB_SINGLE) = Campo
Next
----------------------
Mike
	View 8 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
  
    
	
    	
    	Dec 14, 2006
        
        Hi All a newbie here so any help will be appreciated, 
sorry for the long post but trying to give you all the information you might need.
I wrote a basic access database for my Church to aid in a paperwork audit for a charity food drop which we do monthly to give free food to the needy.
But each month it gets harder to find out who was in line first so I thought with all your help we may be able to randomize the names each month in a different order as to avoid confusion and also avoid people waiting in line as they turn up at 5am and we don't start until 9am.
So if this will work in access they can all come for 9am
I don't mind creating a new database and adding the additional information, if that's what it would take.
My Background I have created basic databases from scratch not using wizards, But I don't  know much about code or how to implement it so any help in where code goes it would be very much appreciated.
Database details (Microsoft Access 2002 version)
Table Name = details
Field name = ID (auto-generated)
Field name = FirstName (text)
Field name = Surname (text)
If possible it would be nice to keep a record of the randomized lists (in the database somewhere ?) each month in case anyone wants to see it or disputes the lists, where I can just create a report to show the details.
There will be approximately 90 to 125 names.
Thank you in advance for all your help in this matter
Britgent
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 21, 2007
        
        Why does the following code generate an error.  All i want to do is open a recordset which I thought would be straightforward. (novice Programmer, new to access vba).  The set statement in the ComboProduct event generates the error.
Option Compare Database
Dim Company As String
Private dbaProposal As DAO.Database
Dim EffectiveDate As Date
Dim Product As String
Private rstProposal As DAO.Recordset
Private Sub ComboProduct_AfterUpdate()
    Product = ComboProduct.Value
    Set rstProposal = dbsProposal.OpenRecordset("SELECT * FROM Proposals WHERE Proposals.[Group Name]='" & Company & "' AND Proposals.[Effective Date]=#" & EffectiveDate & "# AND Proposals.Product='" & Product & "'")
End Sub
Private Sub Form_Load()
Set dbsProposal = DBEngine.OpenDatabase("Database1.accdb")
End Sub
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 2, 2005
        
        I have a table called Contacts and a form with two combo boxes for searching for records either by name or property name. The following code works fine for finding the first record, but I want to be able to show on the form all (and only) those records which match the combo box entry. Currently rowsource for name box is:
************************************************** *
SELECT [Last Name1] FROM Contacts UNION SELECT [Last Name2] FROM Contacts
ORDER BY Contacts.[Last Name1];
************************************************** *
and code is:
************************************************** *
Private Sub Combo214_AfterUpdate()
    ' Find the record that matches the control for Last Name search
    Dim rs As DAO.Recordset
    
    Set rs = Me.Recordset.Clone
    rs.FindFirst "[Last Name1]= '" & Me.[Combo214] & "' OR [Last Name2]= '" & Me.[Combo214] & "'"
    rs.FindNext "[Last Name1]= '" & Me.[Combo214] & "' OR [Last Name2]= '" & Me.[Combo214] & "'"
    If Not rs.EOF Then Me.Bookmark = rs.Bookmark
    Combo214.Value = ""
    txtFirstName1.SetFocus
End Sub
************************************************** *
Rowsource for property box is:
************************************************** *
SELECT Contacts.PropertyID, Contacts.PropertyName
FROM Contacts
ORDER BY Contacts.PropertyName;
************************************************** *
and code is:
************************************************** *
Private Sub Combo212_AfterUpdate()
    ' Find the record that matches the control for Property Name search
    Dim rs As dao.Recordset
    Set rs = Me.Recordset.Clone
    rs.FindFirst "[PropertyID] = " & Str(Nz(Me![Combo212], 0))
    If Not rs.EOF Then Me.Bookmark = rs.Bookmark
    Combo212.Value = ""
    cboPropertyName.SetFocus
End Sub
************************************************** **
Any help is appreciated!
	View 7 Replies
    View Related
  
    
	
    	
    	Oct 28, 2013
        
        So Im trying to populate the listbox using string connection and having this error: "the object you entered is not a valid recordset property" 
here's the code:
    Dim cnn As ADODB.Connection
    Dim rst As ADODB.Recordset
   Set cnn = New ADODB.Connection
   cnn = "DRIVER={MySQL ODBC 5.1 Driver};SERVER=xxx;DATABASE=xxx;Port=xxx;USER=xxx;  PASSWORD=xx;OPTION=3;"
    
[code]....
Where is the error??? am doing right or is there any better way to populate listbox from string connection.
	View 8 Replies
    View Related
  
    
	
    	
    	May 5, 2013
        
        I need to come up with a way to derive field X (see below) in a query.  
For each change in field A, Set X=1
For each change in field B, X=X+1
The below table shows what the query results should look like. 
A
X
B
[code]....
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 18, 2005
        
        Hi all,
Before I start, please know that I am what you call a newbie to a certain extent even though I created in the last 3 years a very complex and efficient database for my business.
This is going to be hard to explain, but I'll try.
The time came to stop creating the Price List in Excel and copy and paste in Access.(mainly to make it easy for other person to maintain and understand)
I know more or less the tables that will need to be created.
My problem is how to store calculated fields in a table (I know I really shouldn't, but how else can I accomplish this), since all the costs and selling prices are the result of complex formulas.
If this information is not enough to understand my question please let me know.
Thank you for any help.
Emilio
	View 10 Replies
    View Related
  
    
	
    	
    	Dec 2, 2005
        
        I have a db which enables users to enter expenses.
tblExpense
tblExpenseDet
tbleExpenseMileage
tblExpenseDet & tblExpenseMileage are joined to tblExpense
As the expenses are entered at User Level not Client Level, I need to extract the Client ID from the 2 sub tables to create a list grouped by client so we can report the billable expenses.
I'm thinking union query but wouldnt know where to start.
Any help would be appreciated
Ta
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 18, 2014
        
        I have a form with a query set up as the record source. If there are records in this query, the form will display. When the user clicks a button, if there is another record in this query, the form displays the next record. When it gets to the EOF, it should close this form, but EOF is not being recognized (I run debug and it says it's false when the button is clicked)? I get run-time error '3201' after I click the button twice. 
I know for a fact that there are 2 records in this query. So once I click the button on the 2nd record, the form should close.
Code:
Private Sub SelectTblMyMedButton_Click()
    Dim db As DAO.Database
    Dim rs As DAO.Recordset
    Set db = CurrentDb()
    Set rs = db.OpenRecordset("qryMedDataSelect", dbOpenDynaset)
    
[Code] .....
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 8, 2014
        
        I have learned the basic looping technique for going through a record set from the following link.  I need to know if my logic is on the right track. URL...
My question is a followup to a thread that was opened on this forum: URL....I want to do the following:
1) Use record set looping technique to fix a variety of incorrect naming conventions to a standard format
2) Update the table (or create a new table) from the updated record set values. (Is my logic going to update the table selected in the code I used to dimension the record set or will I need to do something else to make the changes available for other tasks after record set is closed ?  After the naming conventions are fixed this data will be available for excel automation that I am working on and posting questions on another thread in this forum.  HAHA I'm going code BANANAS)
3) rs.fields![fleetlocation] is used so many times, how can I make this a variable (what do I dimension the variable as?)
4) Use an AND statment with an if statment (how to do this with correct syntax)
Code:
sub loopandfix()
on error goto errorhandler:
strSQL = "tblUnionQueryResults"   'table was created from a union query but has inconsistant naming conventions for the fleet location name
[code]....
	View 9 Replies
    View Related
  
    
	
    	
    	Dec 1, 2014
        
        I have the following tables:
 tblOrderDetailsKeyItemIdOrder QtyPO#001A204001002B204001003C304001
 
tblTransactionsKeyTransDateItemIDReceivedPO#0011/1/2014A1040010021/2/2014B2040010031/3/2014A54001
 
I also have a table that list the items and on that table the column ItemID is the key.I want to create a query that will list all items ordered on a PO# and how many have been received so far. With that I will calculate the outstanding qty. I want to see:
qryOutstandingPOPO#Item IDOrder QtyReceivedOutstanding4001A201554001B202004001C30030
 
But all I see is this:
qryOutstandingPOPO#Item IDOrder QtyReceivedOutstanding4001A201554001B20200
It is missing item C because I have not received any yet so there are no records in the Transactions table for it to select.
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 9, 2012
        
        How to I can create next record and previous record button in listbox. [URL] ....
	View 14 Replies
    View Related
  
    
	
    	
    	Oct 11, 2011
        
        Refer to the image below:
I want to make a form with the following criteria:-
Has one dropdown list. (like in the picture) Has one table. (like in the picture) When I select an item (for example: Syarikat A Sdn. Bhd.), the table below it (yellow circled), will automatically change data according to the corresponding selected list so that user can edit/add/delete the data in the table.
The issue: I already made the dropdown list and table, but how can I make the number 3 condition.
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 9, 2011
        
        I am brand new to using access databases but I am in the midst of trying to set one up for controlled distributions of controlled documents.Essentially, I have three tables: 
1) Listing of all our controlled documents and their properties (doc number, doc title, doc revision, doc type, doc status, effective date), 
2) Listing of all our copyholders (name, location, phone number), 
3) Document Distribution List which lists copy numbers, quantities, and medium to deliverable (paper, electronic, size, etc)
 
What I want to do is create relationships within the Document Distribution List (using 'add from existing fields') from the other two tables so when a request for a new controlled copy comes along, I don't have so much data redundancy.
 
For example, in Table 1, I have listed Document XYZ and copyholder Jane Doe from Table 2 wants to receive 1 copy of Document XYZ. I would like to have Table 3 have an added field from Table 1 where I can pull down the applicable document number, which when selected auto fills out it's corresponding details of title, revision, doct type, status and effective date in this Table 3. In addition, after I select the document Jane wants, I want to have another field added to Table 3 from Table 2 which lets me pull down Jane's name to assign her a copy number.
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 17, 2013
        
        I am trying to open a child recordset but keep getting Error 424 "Object required".
Dim rstEmails As DAO.Recordset2, DBS As DAO.Database, rstFile As DAO.Recordset2
Set DBS = CurrentDb
Set rstEmails = DBS.OpenRecordset("Beldenemails")
Set rstFile = rstEmails.Fields("email").Value        'Error 424 here
End Sub
I've tried everything I can think of. 
	View 4 Replies
    View Related
  
    
	
    	
    	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