Modules & VBA :: Allow User To Select Record From Subform And Add It To Table - Insert Statement
			Jun 18, 2013
				I have a sub form with staff records on it within a main form. I am trying to allow the user to select a record from the sub form and add it to a table, here is my code which, to me, looks correct. However it gives me an error saying "Syntax error in INSERT INTO"
 
Code:
Private Sub Command3_Click()
Dim dbs As Database
Dim sqlstr As String
Set dbs = CurrentDb
Forename = Nz(Forms!frm_Capex_Submission!frm_staffSub.Form.shy_forename, "")
Surname = Nz(Forms!frm_Capex_Submission!frm_staffSub.Form.shy_surname, "")
[Code] ....
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Mar 4, 2014
        
        I have an append query that contains an IIF statement. I want to code that into a VBA function. The SQL view of the query looks like this:
Code:
INSERT INTO tmpAvailInv ( NUID, Inv_Name, F_Name, M_Name, L_Name, Role )
SELECT tblPeople.NUID, tblPeople.[F_name] & IIf(IsNull([M_Name])," "," " & [M_Name] & " ") & [L_Name] AS Inv_Name, tblPeople.F_Name, tblPeople.M_Name, tblPeople.L_Name, tblPeople.Role
FROM tblPeople
WHERE (((tblPeople.Role)="Investigator") AND ((tblPeople.Archive)=False));
What I wrote for the VBA code is this:
Code:
    Dim strSQL As String
    Dim db As Database
    Set db = CurrentDb
 
[code]....
Where it chokes is on the IIF statement with the double-quotes in it. I've tried several combinations with single quotes and double double-quotes. I'm just not getting it.
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 13, 2015
        
        I am getting a syntax error on my SQL statement.
On a form I have a sub form containing the field txtGuestID - whose control source is GuestID.
On the main form I have a button that fires the code below.
I am sure I am not referring to the control txtGuestID correctly. 
Code:
Private Sub cmdInbound_Transport_Click()
Dim iProductID As Integer
Dim sSQL As String
On Error GoTo cmdInbound_Transport_Err
[Code] ....
	View 6 Replies
    View Related
  
    
	
    	
    	Aug 1, 2006
        
        hi guys. i  was hoping you guys could help me, i have a combo box "cbocontract" which gets populated according to a selection from another combobox(cboAll). now i have another combo box(cboStatus) which according to what the user selects in cbocontract list box it should display active or inactive, now i have the row source from the cboStatus like this: 
SELECT DISTINCTROW Test.Status FROM TEST WHERE (TEST.Facility=forms![Change of Status]!txtInvoice.value) and (TEST.PM_Contract_ID=forms![Change of Status]!cboContract);  
it works perfectly, however is there a way to  make put this code in a text box? how do i insert the select distinctrow into a textbox??? it should only display one value according to what the user selects in the cbocontract combo box... also, the user should be able to edit this textbox. 
:o
	View 4 Replies
    View Related
  
    
	
    	
    	Feb 14, 2008
        
        Greetings,
I have a form that contains an unbound listbox that is populated from a table. The user selects multiple records in the listbox and then clicks on a "Commit" button. The "Commit" button then copies portions of the records to another table. (And now that I am analyzing the flow of data, I realize that not all the data needs to be copied over, but I'll fix that at a later time).
Anyway, the code looks like this:
Code:    Dim lst As Access.ListBox    Dim rownum As Variant    Dim vHEDR, vLeague, vFname, vMI, vLname, vClass, vQual, vSex, vYouth As String    Dim intResponse As Integer    Dim sqlstr As String        Set lst = Me![lstHistorical]        DoCmd.SetWarnings False    For Each rownum In lst.ItemsSelected      vHEDR = CStr(lst.Column(0, rownum)) & ","      vLeague = "1,"      vFname = Chr(34) & lst.Column(1, rownum) & Chr(34) & ","      vMI = Chr(34) & lst.Column(2, rownum) & Chr(34) & ","      vLname = Chr(34) & lst.Column(3, rownum) & Chr(34) & ","      vClass = CStr(lst.Column(4, rownum)) & ","      vQual = CStr(lst.Column(6, rownum)) & ","      vSex = Chr(34) & lst.Column(8, rownum) & Chr(34) & ","      vYouth = Chr(34) & lst.Column(9, rownum) & Chr(34)'<<Here>>              sqlstr = "INSERT INTO tbl_RosterTest (HEDR, LeagueID, Fname, MI, Lname, ClassID, QualID, Sex, Youth) VALUES (" & vHEDR & vLeague & vFname & vMI & vLname & vClass & vQual & vSex & vYouth & ")"          DoCmd.RunSQL sqlstr        Next rownum    DoCmd.SetWarnings True    MsgBox ("Persons successfully registered")
At the <<Here>> point, I would like to proc a single dialog box the query the user for some additional information - 2 items from comboboxes and one is a yes/no. Is there a way to gather the info so I can insert the values into the INSERT string?
Thanks.
	View 8 Replies
    View Related
  
    
	
    	
    	Nov 8, 2013
        
        what is wrong with the following statements. I'm new to access SQl. This would work in ms sql.
Code:
DELETE from Table1
INSERT INTO Table1(email, productid, datecreated, datesend) values ('adf', 5, '10/10/2012','10/10/2012')
Select * from Table1
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 8, 2004
        
        Hi, I was wondering why the following code would give me an invalid SQL statement message:
 
    Dim Rs As New ADODB.Recordset
    Rs.Open "Manzanero # 450", CurrentProject.Connection, adOpenKeyset, adLockBatchOptimistic
The error message is:
 
"Invalid SQL Statement; expected 'Delete', 'Insert', 'Procedure', 'Select', or 'Update" 
I'm just trying to open up the table "Manzanero # 450" so that I might add to its contents.  I have Microsoft Active X Data Objects 2.6 library included as well.  I find it strange since this is basically a line for line copy of a sample I found in a MS Access book.  Please help.  Thanks! =)
 
G
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 12, 2013
        
        The problem I am facing is applying an IF statement to every record in the detail section of the subform.
 
I have the following code:
 
Code:
If Me.status = "CONFIRMED" Then
Me.course_ref.Enabled = False
Me.course_date.Enabled = False
Me.cmbModule1.Enabled = False
Me.cmbModule2.Enabled = False
Me.course_start_time.Enabled = False
Me.course_end_time.Enabled = False
Me.course_training_cost.Enabled = False
End If
This is in the on load event of the subform and works 'sort of'
 
Basically I have a record with the status of confirmed and records without this status, but the result of the if statement is being applied to all records. Is this because I need some sort of loop? and if so how would I loop through all records in the detail and apply this if statement to them all?
	View 5 Replies
    View Related
  
    
	
    	
    	Oct 8, 2013
        
        i have a form with 2 subforms. when the user selects a record in subform one. the date of that record filters subform 2. in the source query of subform 2 i have this under criteria
Code:
[Forms]![frmeventbuild]![frmBUILD]![EVENT_DATE]
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 29, 2013
        
        I am attempting to insert a record with selected data into a temp table and I am getting "Run-time error '3075': Syntax error in (comma)...". Here is the code:
Code:
Private Sub XferDataToTempTable()
Dim db As Database
Dim strSQL As String
Set db = CurrentDb
[code]...
	View 7 Replies
    View Related
  
    
	
    	
    	Jun 6, 2014
        
        I have a table called login and inside that table is three columns: username, password and admin. 
I have the username saved in a global variable called GsUser. How can i find the record in that table with the same Username as the string stored in GsUser and use that record for an if statement which sees if the value of the admin column is "Yes". Im trying to do it using VBA. Im not using a form where everything is bounded. 
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 7, 2013
        
        I'm now trying to speed up data entry within my database and have hit a brick wall with one part.Basically, this is within a form (for 'clauses') of which there is a one-to-one relationship with 'the Applicability' table (a series of fields with 'Yes/No' values for each and a related key field) - i.e. for each clause there are a series of circumstances when it will apply. I've set this up to create a record when one doesn't already exist using the default values (i.e. all applicable).
The method to speed up data entry is to have a pop-up form with unbound fields to list common Clause fields - including 'Applicability' as a subform. When entering a series of Clauses you tend to find they have the same 'Applicability' as their neighbour, so I would like to create a corresponding record in the Applicability table with the values set on the 'ClauseQuickAdd' form (Technically the 'ApplicabilityQuickAdd' sub form).I've edited an existing code within my database to provide two global variables (strAppFieldList and strSubAppFieldList) to put into the following statement:
Code:
DoCmd.RunSQL "INSERT INTO Applicability ( AppRelClause, "" & strAppFieldList & "") VALUES ("" & Me.Clause_ID & ", " & strSubAppFieldList & "")"
Bringing up Error 2498 "An expression you entered is the wrong data type for one of the arguments". So I presume that I haven't quite got the format right for transferring yes/no values (strSubAppFieldList). See below for an extract of strSubAppFieldList:
Code:
Forms('ClauseQuickAdd')![ApplicabilityQuickAdd]![Manufacturer], Forms('ClauseQuickAdd')![ApplicabilityQuickAdd]![Supplier], ...
	View 6 Replies
    View Related
  
    
	
    	
    	Jul 10, 2013
        
        I need my INSERT statement to DLookup tbl_module_repairs and insert the information from a field based on a WHERE condition of primary key matching on the form and table. Here is what I have but it will not work on the last value:
Code:
Dim lookModType1 As Variant
lookModType1 = DLookup("module_type", "tbl_module_repairs", "prikey = " & Me.txt_prikey1.Value & "")
SQLtext4 = "INSERT INTO TBL_RF_TECH_LOG ([TechID], ActionStatus, Barcode, EquipmentDescription) Values (Left([txt_techid_rework_in], 2),'In Rework', '" & Me.txt_bc1 & "', " & lookModType1 & ");"
DoCmd.RunSQL SQLtext4
Note: My DLookup works fine by itself for other uses.
	View 5 Replies
    View Related
  
    
	
    	
    	Jan 22, 2014
        
        I am having a problem with below and getting a run-time error 3134
Code:
LastOrderNumber = DMax("Order", "Model_types")
NewOrderNumber = CLng(LastOrderNumber + 1)
CurrentDb.Execute "INSERT INTO Model_types (Order) " _
            & "VALUES (" & NewOrderNumber & ")"
The field 'Order' in Model_types is a Long Integer.
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 28, 2013
        
        Look at the below SQL 'INSERT INTO' statement ?  I'm trying to insert multiple variable values into an 'INSERT INTO' statement.  I'm getting the below error message.  The code is listed below.  I started out with two (2) variables, but will have thirteen to insert into a table.  Also, in the code below is the VBA statement to retrieve the variable data.  I'm getting the data, but cannot insert the data into the table. 
Private Sub Test2_Click()
Dim strSQL As String
Dim strSalesman As String
Dim strContentArea As String
DoCmd.SetWarnings False
[Code] ....
Error
Microsoft Visual Basic popup
Run-time error '3061'
Too few parameters. Expected 1.
	View 5 Replies
    View Related
  
    
	
    	
    	May 6, 2014
        
        I have a subform containing a list of Funds and attributes such as Asset Type, Fund Manager, etc.
Currently, I have a textbox, where the the control source is set so that it will be updated with the Asset Type from the subform.
I also have an unbound combo box that contains a list of Asset Types queried from a table via row source, where user can select the Asset Type.
What I would like is when a record is selected from the subform, the Asset Type is selected on the combo box as a default value. User can select another Asset Type if required. How can I do this?
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 29, 2014
        
        I've got a form, user inputs a whole bunch of data and the data is stored into 2 different tables (using a form and subform), however i also need to copy a few fields from the subform into another table (as a new record) the table i intend to insert this data into (tblAdjustments) has four fields (that im interested in) Type, Reason, Quantity and Product (not the exact names) Type and reason are both just straight strings and will be the same each time, regardless of what the other two variables are, so i need type to equal "Finished Goods" and Reason to equal Produced further to that, the subfrom has 2 fields, batchPackedQTY (which will be quantity in the new table) and fgID (product in the new table
so i need an insert into statement that does this, ive tried INSERT INTO tblAdjustment (adjType, adjReason, fgID, adjQTY) ("Finished Goods", "Produced", Forms!SubFormBatches.fgID, Forms!SubformBatches.batchPackedQTY)
	View 10 Replies
    View Related
  
    
	
    	
    	Jul 16, 2013
        
        I am trying to create a form in which users can save new supplier data to a database. I am using two insert statements which insert similar data in to two similar tables. The insert statements appear to have no problems and no errors are produced upon execution yet the new data doesn't save into the tables. Here's the code;
Code:
Private Sub Command14_Click()
Dim sqlstr As String
Dim dbs As Database
[code]...
	View 11 Replies
    View Related
  
    
	
    	
    	Dec 4, 2013
        
        I am trying to create an INSERT statement from a form to put unbound fields in a table.  The challenge that I am a getting is that I am getting a 
 
Run-time error '3075' Syntax error in date in query expression '#'
 
What is really perplexing and perhaps something that may guide in identifying the culprit is that I have an identifcal form that uses the identical code and it works.
 
Here is the code below:
 
Dim strSQL As String
Dim strCriteria As String
strSQL = ""
strSQL = strSQL & " INSERT INTO [tblTicket]"
[Code] ....
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 29, 2014
        
        I have a SELECT statement which works
Code:
"SELECT Bookings_Table.Booking_Time, Bookings_Table.Num_Slots, Bookings_Table.Booking_Date FROM Bookings_Table ORDER BY Bookings_Table.Booking_Time;"
But when i add the WHERE
Code:
 "SELECT Bookings_Table.Booking_Time, Bookings_Table.Num_Slots, Bookings_Table.Booking_Date FROM Bookings_Table WHERE (((Bookings_Table.Booking_Date)=[TB_CAL_DATE])) ORDER BY Bookings_Table.Booking_Time;"
it doesn't work [TB_CAL_DATE] is a textbox with a Date in it...
	View 3 Replies
    View Related
  
    
	
    	
    	Oct 7, 2014
        
        I have a database with several one-to-many relationships and a nested subform based off of those relationships. Relationships are as follows:
One Lender to Many Relationship IDs
One Relationship ID to Many Tax IDs
One Tax ID to Many DocumentsRequired
 
My forms are nested as follows:
Relationship ID form (contains info for Relationship ID and Lender)
-> Tax ID
-> DocumentsRequired
 
I believe I'm just overcomplicating this. But I have simple search box (an unbound text box with a command button), which is located on the top-level form for Relationship IDs. As you'll see above, that form only contains the fields for Relationship ID and Lender. However, users have to be able to search by Relationship ID, Customer Name, or Tax ID number, the last two of which are only available on the nested subforms. Currently I have the search box reaching out to grab results from a query. When I assign the results to the Me.RecordSource, it works perfectly except that it's in read-only format. The users have to be able to edit the results of their search. I'm not even sure I'm doing this in the easiest fashion. I would have preferred to just use the select statement to search through the subform, but I'm guessing my syntax was wrong because I never got it to work. Below is what I currently have. 
Dim strtext As String
Dim strsearch As String 
strtext = Me.SearchBoxTxt.Value
strsearch = "SELECT [Relationship ID] " & _
"FROM CustomerNormQuery " & _
"WHERE [Relationship ID] like ""*" & strtext & "*"" OR [Customer Name] Like ""*" & strtext & "*"" " & _
"OR [EIN/SSN] Like ""*" & strtext & "*"" " & _
"GROUP BY [Relationship ID]"
Me.RecordSource = strsearch
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 26, 2014
        
        I have a boolean array, foundState(3), whose 4 elements correspond to 4 variables describing conditions that will dictate what action is taken upon closing a form.
There are only 6 possible outcomes for the array, and they can be divided into just 4 cases:
    Case {T,T,T,T}
    Case {T,T,T,F} OR {T,T,F,F} OR {T,T,F,T}
    Case {T,F,F,F}
    Case {F,F,F,F}
What the proper syntax would be for this if I'm trying to create a "Select Case" statement for these 4 cases. 
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 22, 2013
        
        Code:
 
strSQL = ("INSERT INTO " & strTable & " Select c.OrderNumber, c.Item, c.RepId, p.ProductNbr, p.Name, [tbl_LBP_Sales Location Num].[Rep Region Code] FROM CalculateTotal c, dbo_PartNew p, [tbl_LBP_Sales Location Num] WHERE ([Structure] like '*" & u & "*') AND ([ProductNbr] = '" & txtPartNumber & "')")
 
CurrentDb.Execute strSQL
It keeps giving me this error and I don't know why?...
 
I tried replacing the brackets around Rep Region Code with quotation marks as well as these things `` but kept getting the same error...
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 22, 2005
        
        Hi
I have a small database with 4 tables that I am using for the current problem.
The tables are call, parents, mailman, orders.
Call and parents are related by the call ID (a primary key in the Call table.).
Mailman and orders are related by a Unique Id (a primary key in the mailman table.).
Forms involved are frmmain and frmsub.
Frmmain contains the call table information in the main form and parents information in the subform.
When a user enters a call with call ID and enters the operator name and parents information in the sub form, 
When a user clicks the OK button on the main form, necessary changes should take place
if they enter the case type in the sub form part of parent information as ‘missing information’ or ‘missing link’ then the parent information with fields first name, lastname, case type, operator information should be inserted into mailman table in appropriate fields.
Simultaneously a record should be inserted into orders( after the record is first inserted into mailman, since both tables are linked with unique id)  with the following information.
Orderid being autonumber.
Uniqueid from the mailman table.
Orderdate system date.
Ordertype should be “Mailman”
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 26, 2005
        
        What is the syntax of create table and insert statement for access 2000 db. 
 I want to paste the create table and insert statement to access 2000 "sql view window".
 Therefore i want the correct syntax and format for these statements.
 The reason that i want do this is that I created an application that generates create 
table and insert statements for access db in text file and this way i want to test my application if it 
generated the statement correctly.
	View 3 Replies
    View Related
  
    
	
    	
    	Jan 6, 2014
        
        SQL stored procedure which is simple INSERT statement on a single table 'tblSOF' 
Code:
-- ================================================
-- Template generated from Template Explorer using:
-- Create Procedure (New Menu).SQL
--
-- Use the Specify Values for Template Parameters 
-- command (Ctrl-Shift-M) to fill in the parameter values below.
[Code] ....
I am stumped with the following error.
Error: Msg 102, Level 15, State 1, Procedure InsertINTO_tblSOF_sp, Line 80 Incorrect syntax near ')'.
	View 2 Replies
    View Related