Modules & VBA :: Search SubDirectory - Find And Open A Folder Based On Text Box
			Sep 8, 2014
				I am 2 years into my database. I am trying to find and open a folder based on a text box.  The problem is folder could be in many sub folders which is hold on our J: drive.
To further complicate, the folder i am searching may not be exactly as the text box states.
EG. Text box could say 123456 however the folder could be called M123456 etc.
How do i locate a folder or subfolder and open it based on part of a text box...
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Mar 16, 2015
        
        I'm trying to open a folder based on a BIN nr. This folder could be in a main folder that has diferent subfolder. As there where differnt naming used to create the folderes, one of the things they have always is the BIN nr. It alwasy start with a unique number and maybe I could use it to scan the subfolders and open that one that the BIN nr is equal as in the field BIN.
Now we have serveral 1000th of folders and finding them takes time.
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 18, 2012
        
        My situation is that the access form field name is "Number" , there is a folder named "member" in 
desktop C:UsersTomDesktop
For example If i press the command button (Field name "Number" is 123) in form , then automatic open named "123" folder inside named "member" folder
What is the Command button Code ?
	View 4 Replies
    View Related
  
    
	
    	
    	Jul 8, 2015
        
        how to read a specific line in a CSV file (using VBA), to see if the phrase "There are no records available." is present.
If it is present, then I'm going to do a debug.print stating that there are no records to load - and then the script will move on to the next file. If the phrase isn't present, then I'm going to upload the file to Access, parse the information, and then upload it to a CRM. (I already have the latter portion of the code up and running....I just need to account for the first part, where I can determine if the file has data or not).
The structure of the file never changes. The first row is composed of eight column headers (Post Date, Card Number, Card Type, Auth Date, Batch Date, Reference Number, Reason, Amount) and (if) the phrase "There are no records available." is present, it will show up on the second row, in the first column (under Post Date).
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 2, 2015
        
        I'm trying to automate a process of selecting a set of file/s and move them in a folder. When I click on a button, it should open a current folder that is setup in the code.
Lets say that I have a folder C:documents	est, and very time I click on the button, it should open the dialog box with that path so I can select the files from another folder, drag them there and they will be saved in that folder.
This will form part of wider automation that will send an email stating that those file/s where placed in that folder.
I have in the same form where the button is placed, 3 check boxes that needs to be passed to the email as well that one or all the files where placed in the folder.
	View 10 Replies
    View Related
  
    
	
    	
    	Apr 27, 2015
        
        I am trying to display an open file dialog window so that the user can pick up a file. I wish the window to show a specific folder. How can I do this? The code I am using is below. The parameter InitialFileName has no effect on the outcome. 
Code:
Function GetFileName(strPath As String, imtype As String) As String
On Error GoTo Err_GetFileName
    Dim Dlg As FileDialog
    Dim sfl As FileDialogSelectedItems
    Dim sflitem As Variant
    Set Dlg = Application.FileDialog(msoFileDialogFilePicker)
    
[Code] .....
	View 11 Replies
    View Related
  
    
	
    	
    	Dec 18, 2014
        
        I have a tree-view object that is filled with a specific folder list, when a command button is pressed I would like too expand to a specific node based on a variable/foldername.
How to achieve this? My knowledge of tree-view is limited and I am still learning VBA. 
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 28, 2014
        
        I've been trying to search for all picture files in my documents and copy them to a folder on the desktop.  I found this and it work great for searching however I'm having trouble getting the copy to work. [URL] ....   
Code:
 Dim colFiles As New Collection
    RecursiveDir colFiles, "C:Photos", "*.jpg", True
    Dim vFile As Variant
    For Each vFile In colFiles
        Debug.Print vFile
    Next vFile
Code:
 
I replaced the debug.print vfile with my copy function.  I've tried copyfile but it needs to specify the destination with the file name.  I tried using the FSO filecopy method and can't get it to work (keep getting a compile error "Expected =")  I feel the hard part is done and this part should be simple.
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 18, 2013
        
        I have 5 textboxes and a multiline textbox in a form in my Access Database. I am going to type several keywords in those textboxes and I am going to type an article in the multiline textbox. 
What I need to do is I want to calculate the keyword density in the article. I can do that if i know how to search the whole text in the article and count the specific word. And I want a function to count all the words in the article too.
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 5, 2013
        
        I have some vba where I'm importing a text file and splitting it out into a table. For the most part its working just fine.
 
But I have a line of data that I need to pull out the string right after "Old" - Murphy and right after "New" ZMurphy
 
Acc# : 111111 This is test data, Person : 22222 Old Murphy New ZMurphy
 
I'm thinking Instr() could do this but I'm unable to get it to work. 
 
I am using Access 2010...
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 12, 2014
        
        I need to return a folders directory to a text box on my forms record called Files_Directory when i click the Browse command button... The folder will have more folders within it along with documents all relivant to the folder selected, hense the need for just the folder directory rather than a file.
	View 12 Replies
    View Related
  
    
	
    	
    	Jan 21, 2015
        
        I have a split db in use by about 20 people. Ocasionally a user opens a record that is already opened by some other user and if changes are made then he gets error 7878; "the data has changed error"
Is it possible to find out which records are actually being used/open/edited in a split db? All tables are related to the main key (CallID on table Contacts).
If it was possible to find out, I could have a label show up in the db record search form telling the user not to open that record.
	View 6 Replies
    View Related
  
    
	
    	
    	Jun 5, 2014
        
        Input box Search problem. I have been using the following to find a record in my frmMain using an Input Box:
 
 Private Sub cmdClientIdSearch_Click()
  'Searches for Client by ID number
  Dim rs As Object
  Dim strCriteria As String   
  strCriteria = InputBox("Please enter Client ID" & vbCr & "Do not type leading zeros")
   
[Code] ....
   
It works great if I run it from a command button from frmMain.  But, if frmMain is open and I run it from a command button on my switchboard, I get the following error message:
Run Time error 7951.  You entered an expression that has an invalid reference to the Recordset Clone Property. I tried inserting a command to open frmMain in the first line, even before the two Dim statements, but I get the same result.
	View 6 Replies
    View Related
  
    
	
    	
    	Sep 6, 2014
        
        I got this function which is supposed to find a record based on the primary key, and then give three fields a value if they should be empty.
Public Function DoesXrefExist(faPersonID As Long, faRoleCode As String, faDorpID As Long, faDorpCode As String)
If (DLookup("PersonID", "PEOPLE", "PersonID =" & faPersonID) > 0) Then
End Function
Thats as far as i have got...for the next part.I get the feeling that i need to use the recordset object that exists somewhere.How do i access that recordset object? I have not been using any DAO or ADO, just straight VBA. I know i can create recordsets and stuff using DAO/ADO, but there must be a recordset that  has been created already by the Dlookup command...
	View 5 Replies
    View Related
  
    
	
    	
    	Dec 2, 2013
        
        I'm trying to search a for string within a subform to find information stored on the mainform to which the particular subform belongs. 
The problem is that the subform is generated from a query which uses a number from the main form to generate.
So the subform record is only generated when the correct mainform record associated with it is loaded.
Now to solve my problem I've made a new query that brings up ALL the results that could be generated by the main form and from that I can search to find my search term I'm after and read off the ID number to tie it back to the mainform.
But all of this is done manually, I want a way to do all this using VBA in a way that the user can't edit any records as they are doing it.
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 10, 2014
        
        I have searched for bits of code to copy other people better than I, and had some success but I am failing to complete, so it is now time for me to visit you all. I am trying to open a PDF from a button  on a subform. The location of the PDF is specified in a field. I want to open the PDF and search for a Member ID criteria also listed in a field on the Form.This is my code:
Code:
Private Sub Text12_Click()
Dim strPath As String
Dim Searchmem As String
strPath = [Notetxt]
Searchmem = [MemID]
            
[code]....
Adobe Reader reports "There was an error opening this document. The file cannot be found." but then opens the file (that's something).So it's the "search" bit that is the problem, and I cannot for the life of me get my search parameter to be used.
	View 5 Replies
    View Related
  
    
	
    	
    	Aug 15, 2013
        
        How to write some code that will search a known drive and folder structure for a tif file and on finding it, open that tif file.
 
The known drive/folder structure is as follows:
 
M:CustomerSatisfactionStdDGImages 
 
or it could have the full path as follows:
 
prdfs01QUESTIONSCustomerSatisfactionStdDGImag  es
 
and then there are the following folders which contain any number of tif images:
 
01_Q
02_Q
03_Q
04_Q
05_Q
06_Q
07_Q
10_Q
11_Q
12_Q
13_Q
14_Q
17_Q
18_Q
19_Q
20_Q
21_Q
23_Q
24_Q
28_Q
29_Q
30_Q
31_Q
32_Q
33_Q
34_Q
35_Q
36_Q
37_Q
38_Q
39_Q
AR_Q
HE_Q
SKY_SKY3B
 
I would like to have a button in a form that the end user clicks and they then enter the name of the tif file they are looking for and on pressing enter the file is searched for and if found it is automatically opened up for them to see, if it is not found then a message "File Not Found" is displayed.
 
I Believe that I will need something like this:
Code:
 
Dim FS As FileSystemObject 
Dim filenum As Integer 
Dim tmp As String
Dim Folder As Folder
Dim subFolder As Folder
Dim File As File 
[Code] .....
 
It's when I get to this point that I've got stuck, I don't know how to structure the code required to do the search and on finding the tif file open it.
An example tif file I might search for is: 0H214_2CJ0001905.tif.
	View 11 Replies
    View Related
  
    
	
    	
    	Aug 2, 2014
        
        I have a form (employee info) that requires the user to do a search to find the employee before then editing anything that needs to be edited.  
  
I have a search box that will find the relevant record without any problem, however what I am looking to do is hide text boxes on the form and have them appear only once the search has found the matching record.
  
 If no matching record is found, I would then like a message box that states 'No matching employee, would you like to add an employee' and when the user clicks OK, it then reveals the same hidden text boxes and sets focus to the first one of the bunch.
  
 Now, I have used the 'me.textboxname.visible = True (or False) elsewhere, however, I am not sure how to trigger that after a search.
  
 I assume I am looking at an If statement, but I am not sure how to construct it, hence turning to the experts.
  
Code:
 Private Sub txtEmployeeSearch_AfterUpdate()
 If txtEmployee = DLookup("EmployeeNumber", "tblEmployeeInfo") Then
Me.txtboxname.Visible = True
Me.txtboxname2.Visible = True
 DoCmd.GoToControl "txtboxname"
 Else
MsgBox "Employee Not Found", vbYesNo
 <<<<<<<<<<<<<<<<<<<<<<
 End If
End Sub
 I know that there is a massive gap where I have put <<<<<<<<<<<<<<<<  - but I am stumped as to what to put in there?
	View 3 Replies
    View Related
  
    
	
    	
    	Oct 27, 2014
        
        I was tasked to create an application where by the user enters keywords into an Access form, and when he clicks the button, it will run the keywords against the file names stored in the table and automatically open the Word document that is the best match.
 
I have created a table query called Directory, which contains FPath (Z:), FName (Document1.doc) and Directory (Z:Document1.doc).
 
Code:
Private Sub Command2_Click()
    Dim wrdApp As Word.Application
    Dim wrdDoc As Word.Document
    Dim filepath As String
    Dim strSearch As String
 
    If IsNull(Me.txtSearch) Or Me.txtSearch = "" Then
        MsgBox "Please type in your search keyword.", vbOKOnly, "Keyword Needed"
 
[Code] ....
This is the code that I am currently using to search and open the Word documents, however, this code only manages to open Microsoft Word program without loading any documents. Also, there are no error messages when I click the submit button.
	View 3 Replies
    View Related
  
    
	
    	
    	May 5, 2015
        
        I am simply trying to find text on a Web Browser Control htm page.
 
Using MS Access 2003, I have a form that includes the activeX Web Browser Control.  On load of the form I initialize the web like below:
 
Code:
   Dim strURL As String   
    strURL = "http://www.justice.gov/eoir/profcond/chart.htm"
    Me.WebBrowser0.Navigate strURL
    Me.WebBrowser0.Silent = True
The page loads fine.
 
Now, also, on my form is an unbound text box I call: [txtFind] and a command button I call [cmdFind].  I want [cmdFind] to find the first occurrence of the value in [txtFind].  My code below doesn't do anything when I click the [cmdFind] button. 
Code:
    Public oRange As Object
    Public myfindFirst As Boolean
    Public intTextLength As Long
Private Sub cmdFind_Click()
    Dim sSearch As String
    Dim strText As String
[Code] .....
	View 9 Replies
    View Related
  
    
	
    	
    	Jul 8, 2013
        
        I had the need every so often to quickly find all instances of any (particular) word within the database, without going to the bother of thinking about where that word/subject might be in the data base, I designed a report which does the job nicely. It uses a search form/control, searches and finds all instances of the word (or words) I have asked it to find, then does a report showing all instances of whatever RTF memo fields that contain the word(s).It has to be RTF memo field because (if I wish) it goes straight into the book text I'm writing, and also it searches the book's RTF memo field.
.
The trouble is, at present, I then have to manually "eye scan" the resulting report to find the occurrences of the "key searched for" word, nestling/hidden somewhere within sometimes quite large chunks of text. I would love to have the report show the found "key word(s)" highlighted in (say) light blue or whatever colour, so that I can quickly & easily lock on to it visually. 
I enter the word I want Access to find, into a form called "formfindword" in a text box called Text0. I click on a command box on this form, to open up the report called "Querywhatsandhowschooseword" based on a query of the same name. The query's "what" field (from the main database) has the criteria 
 
= Like "*" and [forms]![Formfindword]![Text0] & "*" 
 
The query's "how" field criteria (in the "or" line of the query design) is also 
 
= Like "*" & [forms]![Formfindword]![Text0] & "*"
 
I have tried to use the Conditional Format facility in Report Layout view, without any luck.I  think therefore that I will need some VBA code (which is totally foreign to me, unfortunately) to make this simple concept a reality. 
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 7, 2014
        
        I have a form (frmSearch), based on (I think) John Big Bootys code. On it, a search box, which filters results as you type. Works great.
Instead of presenting the search results in a listbox, I wanted it in a subform (sfmSearchresults). Also works great. 
Problem was this: I wanted a button on this form, to open another form based on [CustID]. For a listbox, I could use columns(0), but not for a subform. After much trying I got this to work:
Code:
Private Sub cmdVisaPren_Click()
Dim strWhere As String
  strWhere = "[CustID] = " & Me.sfmSearchResults.Form.Controls.Item(5)
  DoCmd.OpenForm "frmAddCust", acNormal, , strWhere, acFormEdit, acWindowNormal
End Sub
The part that I don't understand is the Item(5). The subform is based on a query (qrySearch), from tblCustomers. tblCustomers fields is as follows:
CustID, FirstName,LastName,Adress1,Newspaper1,Newspaper2.
Item(0) in strWhere would return Adress1 as [CustID].
Item (1) = Newspaper1, Item(2) = Newspaper2, Item(3) = FirstName, Item(4)=LastName, and (finally) Item(5)=CustID.
I don't get the logic. With listboxes, I could just count columns for columns().
Have attached my database. It's just a test database, with 4 people. The final database will have about 1200 people, and many more fields. Its .accdb (Access 2013). I tried converting to Access 2002-2003, but couldn't get it to work.
	View 4 Replies
    View Related
  
    
	
    	
    	Apr 21, 2015
        
         I need to find the respective numbers for a textstring when for
  
 abcdefghijkl stand the numbers
 79 81 82 83 84 85 86 87 88 89 91 92
  
 The textstring to  "decode" is for example is 'adgjk'
  
 The result (79 83 86 89 91) should be added into a table by Looping.
 
rs.Addnew
 rs("Letter")= myarray??
 rs("corNumber")= myarray?
 rs.update
 rs.movenext
  
 Something like this.
  
 But I cannot define and Setup the Array, which should be the best way for doing this. 
  
 The Array does not change its Content nor its Dimension.
 Both, letters and numbers are strings.
	View 14 Replies
    View Related
  
    
	
    	
    	Apr 15, 2014
        
        i have got the bellow code that filters a listbox which is based on a query, from a textbox. The code works fine and it Filters, but if i put in too many characters that do not exsit in the data( so it cant display any results) i get an error saying Run time error 2105 - You cant go to the Specified record? how i can catch this error so it does nothing apart from display a blank listbox with no error?
 
code:
 
Private Sub txtSearch_Change()
Me.lstShowSupplier.Requery
DoCmd.Requery
Me.txtSearch.SetFocus
If Not IsNull(Len(Me.txtSearch)) Then
        Me.txtSearch.SelStart = Len(Me.txtSearch)
    End If
End Sub
	View 3 Replies
    View Related
  
    
	
    	
    	May 24, 2014
        
        Ok I'm building a Text Search box that "Live Filters" the results in a ListBox control on the same form.
After typing in a value (Say, for Customer First Name like "Steven") I want the code to do the following:
1. If there is no value in the listbox that matches when the user presses the enter key....open the New Customer form - THIS WORKS
2. If there is a single value in the list, then open this record in the customer form when the user presses the Enter key Receiving a Syntax Missing Operator error on this line:
Code:
   DoCmd.OpenForm "frmContacts", , , "[ID]=" & Me.ListCustomers.Column(0)
However, I use this exact code on a button elsewhere in my project (NOT within an IF Function) and it works perfectly fine! 
Code:
Private Sub txtSearch_KeyDown(KeyCode As Integer, Shift As Integer)
    If KeyCode = vbKeyReturn Then
        If Me.ListCustomers.ListCount = 0 Then
            CmdNewCustomer_Click
            
[Code] .....
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 5, 2014
        
        i have created a MultiSearch query witch puts my results in a list box.under it i have created a button  wich i want to use to print  a report with the criteria i select from my list box if there is more than one result.
Following is the Code i used for my button
 On Error GoTo Err_Command60_Click
    Dim stDocName As String
    Dim stLinkCriteria As String
    stDocName = "ReportLable"    
    stLinkCriteria = "[ProductID]=" & Me![SearchResults]
    DoCmd.OpenReport stDocName, , , stLinkCriteria
Exit_Command60_Click:
    Exit Sub
Err_Command60_Click:
    MsgBox Err.Description
    Resume Exit_Command60_Click
Every time u press the button i get a message syntax error(missing Operator) in query expression
Now i have not used any code in my Query except for
 
Like "*" & [forms]![frmSearchFor]![SrchText] & "*"
Where i made the error
	View 3 Replies
    View Related