Modules & VBA :: Reference To Be Added To Use Recordset Object
Jul 8, 2015Which reference to be added to use Recordset object in Excel VBA. I added "Microsoft DAO 3.6 Object Library" reference but still its not working.
View RepliesWhich reference to be added to use Recordset object in Excel VBA. I added "Microsoft DAO 3.6 Object Library" reference but still its not working.
View RepliesSpecial 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
I am adding new record into subform via recordsetclone method. The problem is that record is added but on save it does not appear in the table. If add this record manual using subform everything works. When record added manually update of the record works fine.
C
'Add Wastage value to flooring area section
Private Sub Wastage_AfterUpdate()
    Dim rsFlArea As DAO.Recordset
    Dim Wastage As Double
    Dim Item As String
    Set rsFlArea = Me.OrderFloorAreaEdit.Form.RecordsetClone
   
[Code] .....
I am in the middle of creating a function that populates two unbound text boxes on a form and then uses those unbound textboxes in a query (Total of 3 unbound text boxes - 2 are populated from this function). The saved query object is working fine when I manually execute it (after the unbound text boxes have been populated). However, when I go to set the same query to a recordset I am getting the "Too Few Parameters. Expected 3." error message. 
 
In the saved query I used the build function to use the unbound text boxes as part of the where clause. Below is the code I am trying to execute: 
PHP Code:
Public Function Test()Dim db As DAO.DatabaseSet db = CurrentDbDim rst As DAO.Recordset
Dim DtBegin As String''FInd the Begin dtstBegin = DateAdd("q", -1, DateSerial(Year(Date), (DatePart("q", Date) - 1) * 3 + 1, 1))
Dim DtEnd As String''find the end dateDtEnd = DateAdd("Q", DateDiff("Q", 0, Date) - 1, 0)
[Code] ......
 The unbound text boxes are populated before the query is set to the recordset.
Is it possible to declare a reference as an object, this way we could avoid our issues with broken references? I would just try it, but it seems like there is a quite a lot of testing it would require.
View 11 Replies View RelatedI want to refer to an objects properties in form: ie...
set a textbox's default value = textbox.name (me.name?)
 
How do I set this in the form's default value (...without using VBA).
I reused one macro to develop a form in MS access.
The macro fetch the record set corresponding to the reference value from the table.
The reformat value is a numeric field.
The macro code is :
Private Sub Modifiable20_AfterUpdate()
Dim rs As Object
Set rs =Me.Recordset.Clone
rs.FindFirst "[Reference_Number] = ' " & Me![Modifiable20] & " ' "
If Not rs.EOF then Me.Bookmark = rs.Bookmark
End Sub
What to change in the above code to make it work....
Hi all,
I've been banging my head against this problem for a while now and making no progress and am hoping someone cleverer than me can provide some assistance in solving it, or point me in the right direction.
Here goes....
I am working solely in the VBA environment and would like to perform an automated process that returns a recordset based on the results of a previously created recordset (assuming of course it is possible in the first instance.)  
The catch is I would like to perform an INNER JOIN using the results held within a recordset.  
I have already achieved this by creating a temporary table (using a SELECT INTO statement) and then removing the temporary table when I am finished but find this is a slower process than I would like.
I have three tables:
Table A - Fields: GROUP, NAME, DATA1, DATA2
Table B - Fields: GROUP, NAME,                      , CITY, DATA3
Table C - Fields:                                            CITY, DATA3
I have the following declarations:
   Dim db As Database
   Dim rs1 As Recordset, rs2 As Recordset, rs3 As Recordset
   Dim strSql As String
   Set db = CurrentDb
Next, I select a specific range I am interested in.  For the purpose of this example, I am only selecting GROUP values of 1,2 and 3.
   strSql = "SELECT * FROM A WHERE A.GROUP IN (1,2,3)"
   Set rs1 = db.OpenRecordset(strSql)
   rs1.MoveFirst
Now, for each record returned in the query above, I would like to process as follows:
      ' // Build SQL statement
      strSql = ""
      strSql = strSql & "SELECT B.* "
      strSql = strSql & "AS jc "
      strSql = strSql & "FROM A "
      strSql = strSql & "INNER JOIN B ON (A.Id = B.Id) "
      strSql = strSql & "WHERE B.Name = " & rs1.Fields("Name") 
      strSql = strSql & " And A.Name = B.Name"
      Set rs2 = db.OpenRecordset(strSql)
      rs2.MoveFirst
The rs2 query returns the results of that query into what I though was a memory resident table referred to as "jc".  (This is most likely where I am going wrong!)
Using this reference, I perform another query...
        
      ' // Build SQL statement
      strSql = ""
      strSql = strSql & "SELECT * FROM jc "
      strSql = strSql & "INNER JOIN [C] ON (jc.City = C.City) "
      strSql = strSql & "WHERE (([jc]![City] In ([jc]![City]) ))"
      Set rs3 = db.OpenRecordset(strSql)
      rs3.MoveFirst
And from this point I would be able to process the results (if any) that I need to....
...if it wasn't for the error:  
"The Microsoft Jet database engine cannot find the input table or query 'jc'.  Make sure it exists and that its name is spelled correctly."
I know the table doesn't 'truly' exist as a physical object or entity within the database, so how do I reference this 'phantom' table in a query?
I am happy to provide more details if it would help solve this problem and would really appreciate any feedback that anyone has to offer.
Thanks,
JC
My form respectively subform has a couple of problems related to the recordset as it is available in VBA.
The mainform contains material data, the subform contains the components of that material and a quantity, while the components are materials themselves. The subform's control source is an SQL statement created by the query builder.
Everything worked fine before i replaced the material-selecting combobox in the continuous subform by a textbox and a button. That button leads to another (dialog) form with some filtering options, which in turn returns the number of the selected material. This material gets inserted into the textbox.  To this point it works fine.
But when i enter a quantity before i selected a Material, i get an error message after selecting the Material: This Action was Cancelled by an Associated Object. This happens while executing the following VBA Code on click of the material selection button (exact position commented in code):
Code:
Private Sub cbuSelectComponent_Click()
    ' Select component
    Dim SQL As String
    Dim rs As Recordset    
    DoCmd.OpenForm "Material Selector Dialog", , , , , acDialog, "Dialog"
    If GLB_selected_mat = -1 Then 'cancel
[Code] .... 
I've found the following Microsoft KB Article: [URL] ..... In their example code they use:
' Restore text box value to the original record contents 
' in this case, that is NULL 
datDataCtl.UpdateControls
I assume this is the relevant part, but i have no DataControl (what's that?) and neither found an UpdateControls method in the subform object.
The second error, "no current recordset", occures when i edit an existing component line in the subform that has been added right before (also using the same event and code as mentioned above). If i close the form after adding the component and open it again, it's no problem.
I'm trying to open a recordset in vba and I'm getting the 3061 runtime error,Expected 1. 
I'm trying to open a recordset with a query that uses a reference to a form control.
Code:
 searchtable1 = "qInVisio_RSV"
Set rs = db.OpenRecordset(searchtable1, dbOpenDynaset, dbSeeChanges)
This is the sql of the query:
The highlighted parted is the form referance ( I know it's obvious, just for easier spotting )
Code:
SELECT dbo_FOLIO.FOLIOID, dbo_FOLIO.KIND, dbo_FOLIO.RSVID, dbo_FOLIO.CHKIDATE, dbo_RLIST.ROOMID, dbo_ROOM.ROOMNO, dbo_AGN.LINAPRG
FROM (dbo_ROOM INNER JOIN (dbo_FOLIO INNER JOIN dbo_RLIST ON dbo_FOLIO.RSVID = dbo_RLIST.RSVID) ON dbo_ROOM.ROOMID = dbo_RLIST.ROOMID) LEFT JOIN dbo_AGN ON dbo_FOLIO.AGNID = dbo_AGN.AGNID
WHERE (((dbo_FOLIO.KIND)=101) AND ((dbo_FOLIO.CHKIDATE)>=[Forms]![frmCleaningPlan]![DTPicker]));
also as you can see it's a datepicker control, so the value is a date...
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 RelatedI'm trying to add a search function the searches with ever letter I add to the string in the search box. if the string is not in the recordset then vbred the textbox.
  
Here's my code:
Private Sub txtGroupNr_KeyPress(KeyAscii As Integer)
    Set RstRecSet = Nothing
    Set db = CurrentDb
     On Error Resume Next
If IsNull(txtGroupNr) Or txtGroupNr = "" Then
'        MsgBox "Please enter a Group Number to use as the search criteria", _
[Code] ....
Is it possible to receive an email when a row added to a specific table?
View 3 Replies View RelatedI am in the process of trying to create a DragNDrop feature in the Access database that I've built. I have 3 employee with several different txt boxes all side by side and I need to be able to drag and drop the job from one to another.
 
I need to create a class module to do this but my problem is I don't know how.
I have an Access 2010-form which inserts a record in a MS SQL 2008-database by using an ADODB-connection. I need to retrieve the primary key of the newly added record.
With code at the bottom I create a SQL-string which is stored in variable strSQL. If I execute the SQL-string directly in a MS SQL 2008 Query Window, the record is inserted and the MS SQL 2008-result pane shows a column "ID" with the primary key of the newly added record.
If I execute same SQL-string in MS Access 2010 the record is inserted. However, the code fails on Debug.Print rs![ID] with error "Item cannot be found in the collection corresponding to the requested name or ordinal". Same error appears if I use Debug.Print rs.Fields(0). I've enable the reference "Microsoft ActiveX Data Objects 2.8 Library". It looks as the recordset rs is closed as soon the command "Set rs = cn.Execute(strSQL)" finished.
Why I can't retrieve the Primary Key with VBA-code below? 
 
Code:
Private Sub cmdSave_Click()
dim cn As ADODB.Connection
dim rs As ADODB.Recordset
set cn=New ADODB.Connection
 
[Code] .....
I am trying to display on a form the average number of lines/records per hour that a person is adding to the database.  
 Trying to work with Dfirst and DLast  I'd subtract the time of the most recent record from the time of the first record entered and then divide the number of records to display the average per hour in a text box.
I have a form which have a sub form. In the sub form I have a the direct table to update data on it.
Example:
The form has the name of the project and the subform the name of one of the items of the same project and the table present the documents for the particular item.
The users have the option to add or edir docs to this item.
If I would like to reffer to a value they are entering on this table in VBA . how can I do that?
(I would like to present a msgbox when they are entering a date that isn't right on the table for this item.)
By the way, I can't use validation rule because I have a different dates needed per item.
reference a text box in sub form. I did the same thing for the combo box in it worked perfect. I am not sure why this is not working for textbox. 
This is how I referenced it: 
[Forms]![MainOrderForm]![CuttingNumForm].[Form]![Style1]
Form: MainOrderForm
Sub Form: CuttingNumForm 
Text Box: Style1
I should also mention that "Style1" filed in automatically once a "CuttingNum" field is selected.  
I have a form with a subform. I would like a control in my parent form to uncheck a checkbox control in my subform when that field value is deleted . I can get that to work if there is only one record in my subform but it doesn't uncheck the rest. how to I reference all the records in my subform so all of them will uncheck when I delete that field value?
View 2 Replies View RelatedI had this line : 
GBL_Tab05ID = Me.Tab05ID
 
and wanted to change this.  I have this on the On Current event and it gives me an error because the data is not in the record source when the form opens.  How can I change the me. to the formname?  The form gets dynamically created so i have 
 
    Dim CurrentForm As String
    CurrentForm = Me.Form.Name
then i put
 
GBL_Tab05ID = Forms(CurrentForm).Form.Tab05ID
 
but that did not work...what is the correct syntax?
whatever Microsoft office program is open. The problem i get is that  when i add the reference Microsoft outlook 14.0 object library i get a  compile error "ByRef argument type mismatch".
Code:
Option Compare Database
   Public Enum OfficeAppName
       Outlook = 1
        PowerPoint = 2
        excel = 3
        Word = 4
        Publisher = 5
        Access = 6
    End Enum
     
[code]....
I have a form with 3 levels. 
main - [Welders fm], 
2nd level - [PipingQualificationTickets tbl Subform] 
3rd level - [WelderWps fm] This is a pop up form but is related to the 2nd level formVBA Error
I have a dropdown box [Wps] (3rd Level PopUp) with an after update function to lookup a query [DLookUpWeldWPS Qy] and insert the text into [Wps(s)QualifiedFor] on the 2 level [PipingQualificationTickets tbl Subform] 
Here is the code,
Forms![Welders fm]![PipingQualificationTickets tbl Subform].Form![Wps(s)] = DLookup("[Wps(s)QualifiedFor]", "[DLookUpWeldWPS Qy]", "[WelderWps tbl]![QualificationID] =  " & Nz(Forms![Welders fm]![PipingQualificationTickets tbl Subform].Form![WelderWps fm]![QualificationID], 0))
I am getting an error - You entered an expression that has an invalid reference to the property form/report
The names are all correct to the forms.
I have form named SearchForm and there is unbound subform named Search_blank. Depending on button in menu is used source object of Search_blank. One of the source objects is form named MeasureForm and it has subforms named MeasureForm_sf1 and MeasureForm_sf2. How can I reference public sub in MeasureForm_sf1 from SearchForm? How can I reference public sub in MeasureForm_sf1 form MeasureForm_sf2?
There might be a problem with unbound form. I tried reference public sub named GetLastVal from SearchForm that is in MeasureForm: 
Code  :   Me!Search_blank.Form.GetLastVal
and it was working. Than I tried reference public sub named GetLastVal2 from SearchForm that is in MeasureForm_sf1: 
Code  :   Me!Search_blank.Form!MeasureForm_sf1.Form.GetLastVal2
and I got RunTime error 2465, cannot find MeasureForm_sf1
I have a main form "KZ_SEARCH" and within this I have a subform which is loaded when a button is pressed and is populated with query results (based on text entered in a text box). The subform is called "KZ NOTICES Query subform". That all works fine and the query modifies based on the text entered every time the button is pressed. The next stage is that when the subform is loaded I want the user to be able to select a line from the subform and to jump to that record in another form (which also needs to be opened from that selection). The reference for the record to select in the newly opened form would be the first column of the selected line highlighted in the subform (control name "KZ NUMBER").
View 10 Replies View RelatedI am trying to automate the generation of a reference number incrementally by 1.
In my main table (tblBooking) I have my primary key field autBookingID which is an autonumber. 
In another table (tblBookingStops) I have the primary key as autBookingStopsID as the autonumber and then numBookingID linked to the above table (tblBooking).  I have another field called txtGPSID so this is the number I would like to automate.
So for example:
tblBooking:
autBookingID:  1234
tblBookingStops:
[Code]....
I want to put the code that would populate the txtGPSID on a form in datasheet view and would like to put the code on the load event.
I'm trying to put together a DB for creating notifications to customers. The source file is pulled out from another system as an Excel file, which is then uploaded to Access via VBA. The user runs a query, and then sends the results (customer information) to an Excel file where we have set up a mail merge document (the notification itself).
A customer may appear in multiple records (having multiple accounts), but will only receive one notification.
What we're trying to do is give each notification an unique ID that will become its document reference number once the document is created. The number will need to be the same for all the records in which the customer appears, and they will need to be consecutive, as the documents themselves will be stored in PDF form later on in the process.
So I would like to assign an unique ID to each customer, each time it shows up when querying the uploaded source file (the query is done in a form, that has a sub-form for showing the results). Then, when exporting the query results, they will be also copied and stored to another table, along with the assigned reference number, for monitoring purposes.
The Access file itself will be split and used by multiple users (up to 9 users at a time). In theory, each user will see their own customers (each customer account is assigned to a certain user), but the number assignation will need to also depend on when the query has been run. For example, if user 1 queries the DB at 9:30AM they will get records numbered 1000 to 1050; user 2 (who queries the DB at 9:31AM) gets numbers 1051 to 2100 etc.