Modules & VBA :: Use String To Call Code?
			Sep 12, 2014
				I am trying to use a textbox value to call vba code and can not get it to work.
I keep getting an error on the call str1 line.
Code:
Sub formscript()
Dim str1 As String
str1 = [Forms]![fscripts2]![t3]
'MsgBox str1
If str1 = "" Then
str1 = "err1"
Exit Sub
Else
Call str1 ' this is where it call the script based on value in textbox
End If
End Sub
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	May 22, 2015
        
        I am trying to add 30 or 45 days to a certain date and insert that date in a table. The field is declared as datetime on the SQLServer and has been tried with all date formats, and none, on the access side.The problem I am encountering is that the date is being inserted as 12:00:00 in the table, no date is being stored.When I print out the SQL statement to the immediate window, the date in question shows the correct date.
Code:
Dim a As Date
Dim b As Date
 a = DateAdd("d", 45, Me.DateOfExit) 
 b = DateAdd("d", 30, Me.DateOfExit) 
  strSQL = "INSERT INTO MyTable ( No, Name,DueDate, OriginatedBy, ID, Status) " & vbCrLf & _
            "VALUES (" & Me.No & ",'" & Me.Name & "', " & b & ", '" & Me.Facilitator & "', " & Me.ID & ", '" & "Required" & "');"
I have tried adding the date add code to the SQL string, but that produced the same result.
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 29, 2014
        
        I've got a string variable with a value that could be typically
"ABCD|123|R"
The string needs to be split into its three parts, the pipe symbol being the separator. Then the middle numeric string must be converted back to a long.
I know i could do a loop which identifies each character in turn, but my question is:
Is there a VBA function that can pick out the position in the string of the "|" characters, so i dont need a loop ?
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 4, 2013
        
        I'm having to recode some old MS Access DBs so they will run in the following environments:
Office 2000 on WinXP
Office 2003 on WinXP
Office 2010 on WinXP
Office 2000 on Win7
Office 2003 on Win7
Office 2010 on Win7
When I wrote my code for Office 2000 on WinXP things were simple because directory paths were the same across all computers and I could hard code pathing when using a shell command to launch other files.  
My new approach is to make a function call to the Windows registry to determine the default executable and path for opening a file based upon its extension (see apicFindExecutable in basWindows API module).  
I'm able to use code to create a shell call and debug print it to the immediate window.  If I put my cursor in the immediate window at the end of the shell call and hit [enter] the external file will open as desired.  If I try to open the external file directly through code, I get a file not found error.  
To recreate the error take the following steps:
   (1) browse to files that are accessible from your computer
   (2) click the PREPARE DATA AND OPEN MAIL MERGE DOCUMENTS command button
Shell function call is made by the fnOpenFile function located in the basOpenFile module.  There has to be a trick here that I'm missing.
	View 5 Replies
    View Related
  
    
	
    	
    	Nov 5, 2014
        
        I have the following code that creates a long string that works most of the time but sometimes gets cut short.  I can't understand why it does this. When it cuts the string short it cuts it short in the same place.  Everything gets in the string up to/or about the following code '</Practice Name>'This string is needed to upload info to a server.
Code:
dim msg as string
msg = "<?xml version=""1.0"" encoding=""utf-8""?>" & vbCrLf & _
"<soap:Envelope xmlns:xsi=""http://www.w3.org/2001/XMLSchema-instance"" xmlns:xsd=""http://www.w3.org/2001/XMLSchema"" xmlns:soap=""http://schemas.xmlsoap.org/soap/envelope/"">" & vbCrLf & _
"  <soap:Body>" & vbCrLf & _
"    <UpdateDataForScreens xmlns=""http://mdtoolboxrx.com/"">" & vbCrLf & _
"      <PatientObj>" & vbCrLf & _
[code]....
	View 10 Replies
    View Related
  
    
	
    	
    	Jul 29, 2005
        
        i have a sample function
Function GetPercent(n As Integer) As Integer
Select Case n
Case 1: GetPercent = 100
Case 2: GetPercent = 50
Case 3: GetPercent = 0
End Select
End Function
 
I have a table like this
a | b   |      c    |     d      |   e   |      f    |          percent
----------------------------------------
1  | 2  | 1  | 3   |  3   |  1
3  | 1  | 3  | 2   |  1   |  3
1  | 2  | 1  | 1   |  2   |  1
2  | 2  | 3  | 3   |  1   |  2
1  | 1  | 1  | 2   |  2   |  3
1 = 100
2 = 50
3 = 0
for example the first row
1  | 2  | 1  | 3   |  3   |  1
(100+50+100+0+0+100) / 6
I think if I can call function from query than I write like it:
strSQL = "update table set percent = "  & GetPercent(a)  + GetPercent(b)
CurrentDb.Execute (strSQL)
but sure that I got an error because its not find the a and b
how can I do it?
good day!
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 7, 2013
        
        MS-Access VBA code to separate numbers and string from an alphanumeric string.
 
Example:
 
Source: 598790abcdef2T
Output Required: 598790
 
Source: 5789065432abcdefghijklT
Output Required: 5789065432
	View 13 Replies
    View Related
  
    
	
    	
    	Sep 11, 2012
        
        I have the following in Column A
url.com?valueA
url.com?valueA&valueB
url.com?valueC
I need a function that 
If string "ends with" valueA or ValueC, then replace it with ValueD
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 9, 2006
        
        I would like to use code to change the connection string for linked tables in my front end database. I have tried using the connection property of the TableDefs collection, this seems to work while I step through the code but does not change the existing connection property. Any suggestions?
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 23, 2014
        
        I am facing a problem with ODBC call failed error latly.The problem doesnt occur on my development PC but only on other PC's.I'm a beginer in Access, vba and I cant find a solution to make it work on every machines.
Code:
Dim qSQL As String
DATA = "#" & DatePart("m", DATA) & "/" & DatePart("d", DATA) & "/" & DatePart("yyyy", DATA) & "#"
qSQL = "SELECT Sum([IL]*[TO])" & _
"FROM PUBLIC_S INNER JOIN PUBLIC_SD ON PUBLIC_S.U = PUBLIC_SD.U " & _
"WHERE (((PUBLIC_SD.DAT)=" & DAT & ") AND ((PUBLIC_SD.ANA)='" & ANA & "') AND ((PUBLIC_SD.IA)='" & ia & "') AND ((PUBLIC_SD.AN_C)='PIMSS'));  
  Set Db = CurrentDb()
  Set rs1 = Db.OpenRecordset(qSQL)
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 20, 2014
        
        I have this segment of code that adds data to fields FName and FPath in the table Files. It works fine but the syntax is a nightmare with all the double quotes and symbols.
Code:
strSQL = "INSERT INTO Files " _
          & " (FName, FPath) " _
          & " SELECT """ & strTemp & """" _
          & ", """ & strFolder & """;"
         CurrentDb.Execute strSQL
I have another field in the table Files called CompletedBy that shows who updated the table (they type their name into a textbox Text1 before clicking a command button to run the code). I would like to add this data to the table during the execution of strSQL. All the records added to the table Files will have that value in the CompletedBy field (say, Bob Jones).I tried the below changes but the code doesnt work.
Code:
strSQL = "INSERT INTO Files " _
          & " (FName, FPath, CompletedBy) " _
          & " SELECT """ & strTemp & """" _
          & ", """ & strFolder & """ & Me.Text1 & """;"
         CurrentDb.Execute strSQL
How would I add a value in field CompletedBy, from the textbox Text1, to all records added to table Files when the code is run?
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 15, 2015
        
        I have  3 event procedure with  3 buttons to make them run.I  would like to create another button that can run all  procedures togehter. if I copy one of the procedures  how do I tell it to run the other 2.
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 12, 2014
        
        This is the code I'm trying to run from a Standard Module:
Code:
Public Sub RunPaxCalculations()
Dim frm As Form
Dim intNumberOfRecordsInFilter
[Code]....
	View 4 Replies
    View Related
  
    
	
    	
    	Jul 15, 2013
        
        I spent all day trying to figure out why sometimes I can call an excel function from access and the value will appear on my form, but for some functions (F.inv, binom.inv), it errors out as "object not supported". I browsed all the available libraries in tools/reference but found nothing that seemed to solve this issue. 
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 11, 2013
        
        I am starting to explore VBA and Modules. I recently found a relativly simple way to add an Audit Log to a database without adding two tables for each table as outlined by Allen Browne.
I used a set of code from fontstuff.com and it works great, except when using a sub form. I belive that it is most likely because the use of the Tag property looks at the subform as a control but it holds no value. I am thinking the VBA needs to be altered or the BeforeUpdate command need to specify what form to look in.
The Before Update code is
Code:
Public Sub Form_BeforeUpdate(Cancel As Integer)
Code:
   If Me.NewRecord Then
       Call AuditChanges("SubForm_ID", "NEW")
   Else
       Call AuditChanges("SubForm_ID", "EDIT")
   End If
End Sub
AuditChanges is the Module Event name and CustomerID is the unique identifer for a Subform.
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 14, 2014
        
        On the Windows 7 Developer desktop, the Windows Theme is set to Windows 7.On the Citrix server (for users) the Windows Theme appears to be Windows 95. It is low graphics.The boxes are square instead of rounded. The selected Form Tabs just barely highlight with a thin line while on Windows 7, the selected Tab completely changes color. A basic Message box in Windows 95 looks square and flat. The title bar is very low graphics as one would expect when graphics were not great. Is there a VBA call that can display the OS Theme that affects MS Access?  URL...
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 26, 2013
        
        I was wondering if you can call a textboxes onExit event from another form? On my form a user enters a search criteria into a text box and when they exit the textbox the results are displayed in a listbox.  This form is a subform on my main form.  I want to be able to call this onExit method from the main form.  Is that possible?  When I put in txtSearchBox_Exit, I got an error saying Sub or Function not defined.
	View 5 Replies
    View Related
  
    
	
    	
    	Feb 23, 2014
        
        I have a form with a button to print preview a report. This report needs one input parameter before executing. The computer this will run on is a touch screen and does not have a keyboard. Windows 7 has a "on screen keyboard" program. I want this to run first so that my user can input the parameter.
  
 I have the following which throws an "Invalid procedure Call or Argument"
  
 Sub CallTeclado()
 Dim RetVal
RetVal = Shell("c:windowssystem32osk.exe", vbNormalNoFocus)
 End Sub
	View 4 Replies
    View Related
  
    
	
    	
    	May 29, 2014
        
        I'm trying to monitor a few fields and record who updated them together with the old and new values, so far, I have this; 
This does work ok, I was just wondering if there's a way of referring to the current field, rather than having to specify 'me.NPW.oldvalue' etc.
Code:
Private Sub NPW_AfterUpdate()
        Call LogFieldUpdate(Me.AppNumber, "NPW", Me.NPW.OldValue, Me.NPW)
End Sub
[Code] ......
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 3, 2014
        
        I need a search function that will not just open files based on their names but also drill into the documents and search based on what's in it. The only way I can see now is to use the Window's search function (the one at the start button). Is it possible to call that function into access?how do I re-create the search style of the windows search bar for a specific folder? Something like streamreader
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 16, 2014
        
        I know its not possible. But Just wanted to confirm. Not at all possible?
 
Code:
 
Function PreImport(BookToImport As Workbook)
For Each cell In BookToImport.Sheets(1).Rows(1).Cells
cell.Value = Trim(cell.Value)
Next cell
BookToImport.Sheets(1).UsedRange.Rows(1).Replace ".", "_"
End Function
	View 1 Replies
    View Related
  
    
	
    	
    	Feb 6, 2015
        
        I'm developing an application where I want to call the keyboard up on the screen when a user enters a field.  This is my setup:
Windows 8.1 32 Bit, Access Runtime 2010.
Exact lines of code are:
Dim RetVal
RetVal = Shell("C:Program FilesCommon Filesmicrosoft sharedinkTabTip.exe")
These lines of code work perfectly fine on my development PC which is running Windows 7 64 bit, Access/Office 32 bit.
I know the path to the exe is good.  I can navigate and double click it and it works great.  but the shell command is resulting in the invalid procedure. 
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 13, 2013
        
        I'm looking to use the shell function to dynamically call different pdfs that are in a directory. However I'm getting run time error 5 "Invalid procedure or call argument".
Here is the code (very basic I know)..
Private Sub Liste_Documentation_DblClick(Cancel As Integer)
Dim PathName As String
    PathName = Me.Liste_Documentation.Column(2)
    ' Debug.Print PathName
     Shell PathName
End Sub
A typical filepath name is as follows..
S:VenteVendeursMarcCRMDOCSDiligences KYC - LABFT - V 2013 04 23.pdf
	View 8 Replies
    View Related
  
    
	
    	
    	May 1, 2014
        
        I'm trying to get a value from a spreadsheet to import into my MS Access database. Currently I am trimming the spaces/carriage returns from it but need to strip some more data from the value.
 
Here is my code.
 
trimmed_department = Trim(Replace(new_department, vbCrLf, ""))
Example value being "123 Point 5 Finance and Accounting"
I want to use Mid (I think?) to remove the "123 Point 5" (it is always the same with no exceptions) but don't know how to use it as I don't know how to use multiple parameters within a string.
	View 8 Replies
    View Related
  
    
	
    	
    	Aug 25, 2013
        
        i want to export a table to excel , open this file and execute a macro from another file.
the code i have now is :
Code:
DoCmd.OpenTable "Overzichtaanwezigheid", acViewNormal
 DoCmd.RunCommand acCmdExportExcel
 DoCmd.Close acTable, "Overzichtaanwezigheid"
 Dim XL As Object
 Set XL = CreateObject("Excel.Application")
 XL.Workbooks.Open ("C:UsersErwinDocumentsOverzichtaanwezigheid.xlsx")
 XL.Visible = True
 XL.Run "d:	est.xlsm!Macro3"
Opening the excel file goes ok, running the macro however not.
	View 1 Replies
    View Related
  
    
	
    	
    	Feb 27, 2014
        
        I want to add a string as year to a date.
Somehow it doesn't work out. It should extract all records with Valid_from = 01.01.2013 and valid_to = 31.12.2013. The Year assignment works.
Code:
Public Sub BEN()
Dim strSQL As String
Dim t As Date, s As Date
DoCmd.SetWarnings False
Year = Right(pricedate, 4)
t = 1 / 1 / " & Year & "
s = 12 / 31 / " & Year & "
strSQL = "SELECT TRANSFER_PRICES.* INTO [TEMP] " & _
" FROM TRANSFER_PRICES " & _
" Where [Valid_from] = " & Format(t, "#mm/dd/yyyy#") & _
" AND [Valid_to] = " & Format(s, "#mm/dd/yyyy#")
DoCmd.RunSQL strSQL
DoCmd.SetWarnings True
End Sub
	View 3 Replies
    View Related