Modules & VBA :: Exit A Subroutine From Within Control Loop
			Jan 30, 2015
				 Sometimes I find the 'need' to exit a subroutine from within a control 'loop' e.g. if.. then..else   with... while... et al.
  
 I suspect this is 'bad form' but is there any 'cost' in doing this?
  
There presumably will be if objects have been set and are not reset to Nothing. In this case it presumably is not a problem resetting to Nothing outside a With.. - what about inside a with..??
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Feb 25, 2014
        
        I want to create a table of all fields in a form, their datatype and their controlsource.
I have done the first 2 parts easily enough using the forms.formname.controls.name property
and 
TypeName(forms.formname.controls)
But I am unable to pragmatically read the controlSource.
EG
forms.formname.controls.txtname.controlsource works
but when In a for loop
I cannot use the name of the control to return the control source.
Code:
Sub PopTab
Set frm = forms.FrmCases
for each CTl in frm.controls
MyName = ctl.name
MyType = TypeName(ctl)
MySource = ctl.name.controlsource
end if
next ctl
end sub
	View 3 Replies
    View Related
  
    
	
    	
    	May 17, 2014
        
        I have a database which needs to be updated everyday. So I decided to make a subroutine to perform the update steps just by clicking on a button. 
The problem is that I can run all the steps except one! At the end of the steps, there is a function/module that must be run to calculate and complete the job.
How I can run a function in a vba macro. This is my code:
Private Sub cmdUpdateDatabase_Click()
DoCmd.SetWarnings False
DoCmd.OpenQuery "qry1AddNewStockSymbols"
DoCmd.OpenQuery "qry2AddDailyPrice"
DoCmd.OpenQuery "qry3UpdateStockDailyPrice"
DoCmd.OpenQuery "qry4AddOverallStockValue"
DoCmd.OpenQuery "qry5AllSymbolsActiveDaysTractions"
DoCmd.OpenQuery "qry6SortToCalculateDailyRemainedStock"
DoCmd.SetWarnings True
End Sub
Module name is: CalculateDailyRemainedStock
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 23, 2015
        
        I'm trying to run an sql update query (in VBA) to update values in a table, from calculated field values in a subform (using a query as a record source). 
Is this possible , and if so, can I call the subroutine from the parent form, and what would be the correct syntax for the VBA sql string (i'm guessing it would be a docmd.runSQL sqlstringname )??
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 14, 2015
        
        Imagine I have two subrountines:
Code:
Private Sub DoSomething1()
[Do Something]
End Sub
Private Sub DoSomething2()
[Do Something]
End Sub
And this Declaration:
Code:
Dim str As String
str = 1
Is it possible to refer to/call one of these subroutines using something like this:
Code:
("DoSomething" & str)
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 13, 2015
        
        i want that when i press the space key on my keyboard oi will exit from the form. i searched on the interne t but i couldn't find the proper one. I don't know exactly what i have to write in vba.
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 20, 2013
        
        I am looking to create a backup of a database on exit in a different directory then where I am storing the database now. 
	View 3 Replies
    View Related
  
    
	
    	
    	Dec 17, 2014
        
        Getting error '2450' when click Access close button to exit.
Run-time error '2450': ECN cannot find the referenced form 'frmLogin'.
Note: After login my login form is visible to, cause to get login user id into "frmECN" Form. But When I'm in "frmECN" Form and enter data then close to exit Access main close button I'm getting 2450 error.
	View 5 Replies
    View Related
  
    
	
    	
    	Oct 25, 2004
        
        I want to call a selfdefined subroutine "update()" in several reports. But whenever I try this, Access gives me an Error 2465. The Report is selected dynamically by the user and should adapt itself to other settings made by the user. Can anybody help me how to do this? Thanks.
	View 4 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
  
    
	
    	
    	Dec 15, 2005
        
        Is there anyway to have a subroutine be called when a form is brought up? meaning, as soon as the user opens the form, stuff happens without them doing anything besides opening the form.
	View 1 Replies
    View Related
  
    
	
    	
    	May 6, 2015
        
        i have the following code to get file list from specified directory:
Code:
Dim db As DAO.Database
Dim TB1 As DAO.Recordset
Dim p As String, x As Variant
[Code].....
the field "File_Name " is not set to accept duplicate the above code work fine , but when it find the file name exist on the TB1 it return an error i need the code if find any error continue to retrive other files on the folder not exit loop and also i don't want to make check if file exist it will lower the speed of code
	View 6 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
  
    
	
    	
    	Jun 30, 2015
        
        why my access always go over the loop that I am declaring..Here is a sample of my code:
Code:
  Dim rs As New ADODB.Recordset
  rs.ActiveConnection = conn
  rs.Open mySQL, conn, adOpenDynamic, adLockOptimistic
  For lngProd = 1 To 5
   
[code]...
I get the error of access cannot find the tbl_data6. Where in the declaration I wrote 6??
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 26, 2014
        
        I believe this is most recurring scenario for all. Any simple way like:
 
Code:
For each file in folder.files
Msgbox File.Name
Next File
For your information the above code doesn't work
	View 10 Replies
    View Related
  
    
	
    	
    	May 15, 2014
        
        Basically what I am trying to accomplish is uploading multiples file automatically into server. The code I am trying to use  works great if the user wants to upload a single file manually because the code prompts you to choose the file and I am wondering if there is a way to tweak the code. here is the code I am using 
Code:
Private Sub Form_Load()
Dim objFTP As FTP
Dim strfile As String
[Code].....
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 18, 2013
        
        this is a progress bar, what i need is, while execute loop (progress bar) but also execute next command = "LedgerExe:
 
On Error GoTo Proc_Err
Dim inti As Integer
Dim dblPct As Double
[Code]....
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 3, 2014
        
        I work for an insurance company where various (and multiple) discounts or loads can be applied to a quoted premium for one reason or another. 
 
These discounts/loads are stored in a table with a corresponding customer ID, where each row represents an individual discount/load (labelled and ordered-by a 'Step').
 
Unfortunately, the resulting premium from these discounts/loads is not stored in the database and are calculated on the fly by the front-end. 
 
I have a requirement however, to store the 'new' premiums based on the stored discounts/loads for a report.
 
My problem is that the calculations must occur incrementally one after another, where the discount/load at each 'Step' applies to the resulting premium from the previous calculation.
 
The attached spreadsheet is demonstrative of the existing table where two additional columns have been added to show you what I need to calculate. 'Price_Amount' represents the discount/load in monetry terms relative to the calculation and 'New_Prem' is the premium resulting from the calculation step.
 
Notice that each discount/load applies to the previously calculated premium rather than the original one (Original_Prem = the starting point from which all further calculations should apply).
 
The full table would include many more rows for different customer ID's, where the number of 'steps' could be as few as 1 or as many as 7 per customer ID (ordered by 'Step').
 
Having toiled for many hours in Access to achieve the above, I am now resigned to the fact that only some kind of VBA function will achieve my requirements.
 
This function should take the Original Premium for each CustomerID and loop through each 'Step' applying the relative discount/load based on the value in 'Pricing' and the number type in 'Price_Type'. Once the function has calculated each step per CustomerID and has reached the maximum 'Step', it should move on to the next CustomerID.
such can only articulate the requirements without being able to convert this into actual coded logic. Nonetheless, I am in a bit of a pickle with this one and am under some pressure to create the report. 
	View 7 Replies
    View Related
  
    
	
    	
    	Apr 30, 2015
        
        Is it possible to run a loop through each record in query, but refresh the query in between loops?
The query I am looping needs to be updated before moving to the next record.
t can't figure out how to get the query to refresh before looping.
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 27, 2013
        
        I am using to select and append data to an output table.  Everything is working fine until the last step.  The last step appends all the data to an output table from the initial table.  The intermediate steps select the data to output. 
"AddExpenseToOutput()" is stopping about halfway through the list of criteria. Initially I thought there might be a null in the list, but it doesn't look like there is after dropping everything into Excel to manipulate.  
Code:
Option Explicit
Dim rstAccount As DAO.Recordset
Dim rstAccounts As DAO.Recordset
Dim CAccounts As String
Dim Item As String
Dim AccountKey As String
[Code] ....
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 18, 2015
        
        I have a sample database (attached) where I have a form called frmVoteHeadsOne.  The voteheads that I have are swimming (Swim) and transport (Trans), which both appear for data in a table.  On the form, from the combo list, I would wish that if I select swimming, for example, only Mark Tyler's name is returned since he has paid 2000;  if I select Transport from the same list, only  John clement's name is returned.  
My purpose for doing this is because in the actual database, I have 21 different voteheads which I would like to get different results from based on what the user selects from the combo list.  
	View 8 Replies
    View Related
  
    
	
    	
    	Aug 6, 2015
        
        I've got a problem with a loop for producing worksheets (reports). When everything works there's no problem but when one of the reports namely rptChemoOralWorksheet doesn't have data available to produce the report the loop finishes and then all remaining worksheets don't print.I've put in a standard error handler with MsgBox, but it's never triggered. I've also tried 
Code:
On Error Resume Next
 but again rather than skip the DoCmd.OpenReport "rptChemoOralWorksheet" (when the error is present) and move to the next one to continue printing through the list the loop stops and the subsequent code starts to run.
 
Code:
Dim mydatabase As DAO.Database
Dim rst As DAO.Recordset
Set mydatabase = CurrentDb
Set rst = mydatabase.OpenRecordset("atblChemoWSLoop", dbOpenDynaset)    
Dim rsBN As String
Dim rsDose As Double
[code]....
	View 4 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
  
    
	
    	
    	Jan 9, 2014
        
        I have succeeded with retrieving subTable data from a One to many relationship, however, I'm stuck in an infinite loop processing the first record of the subtable and not moving to the next one.  
Dim db As DAO.Database
Dim rstLandData As DAO.Recordset
Set db = CurrentDb
Set rstLandData = db.OpenRecordset("qryLandData", dbOpenDynaset)
Dim strLandType As String
[Code] ....
	View 7 Replies
    View Related