Modules & VBA :: Scanning Table And Plotting The Path To Right Value
			Aug 3, 2015
				I have a table that contains passive and active devices. I want to find correct active device to which passive device is connected. However passive device can be connected to another passive device and after that to an active device - could be endless times a passive device is connected to passive device and then in the end to an active device. So the code needs to plot the path from beginning passive device to the correct active device.
I will include excel table with data and wanted result.
The criteria for passive devices that need its active device found, is i think something like this:
Code:
SELECT * FROM tablename WHERE [TYPE] = "D3P" AND NOT [Mark] LIKE "*ZUUM*" AND [Sort] = "Passive"
I got the result via doing excel function index-match for like 5 times and excel stalling. However I would like it to be done automatically.
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Jan 8, 2014
        
        I have a table named tbl_imagepaths with fields:
ImageID
File
Folder
The command button has the code below, it works great and pops up with a window with the file name and path. I now just need the code to insert the file name and path into the table....
Code:
Private Sub Toggle7_Click()
    Dim f As Object
    Dim strFile As String
    Dim strFolder As String
    Dim varItem As Variant
    Set f = Application.FileDialog(3)
[Code] .....
	View 7 Replies
    View Related
  
    
	
    	
    	Aug 20, 2014
        
        I am trying to automate the function that imports Infopath (.xml) data into access tables.  I can have a button run the MenuCommand, but then the users have to go through all of the prompts and I just don't trust them enough to do it properly.
All I want is the user to click a button, then it lets them browse for the desired file and then imports it.
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 8, 2013
        
        I have been asked to create a database very quickly for a small group that needs to scan multiple pages into an Access 2007 form. They they would like all scanned documents to be converted to PDF and stored on a shared network folder which can be accessed by their group. I have tried several ideas posted but, I have been unable to get any to work correctly. Any sample of working database that the scanning portion is working? I am so involved with other projects right now that I just don't have the time to create a scanning process on the database. 
	View 5 Replies
    View Related
  
    
	
    	
    	May 16, 2014
        
        I have some code set up to automate scanning from access to a specific folder on the server.  I have searched the web for different codes and have not come across anything that will scan an unknown amount of documents.  The best I found was the code I am currently using, that will scan up to 10 documents separately, then convert these documents into 1 PDF.  This is not ideal, however, because it would require the user to scan 1 document, wait, than scan another, wait, etc.  Also, the code I am currently using will only scan from the glass, not the auto feeder, and I am unsure how to change this.  
Private Sub cmdCOC_Click()
    'scan COC
On Error GoTo Err_Handler
Const DEVNAME As String = "Brother MFC-7860DW LAN"
    Dim ComDialog As WIA.CommonDialog
[Code] .....
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 23, 2005
        
        Hi guys i wrote a vba code that supposed to 
go find all non system tables in access 2000 db 
and generate corresponded create table statements for them.
Unfortunately when i run the program it misses one of the 
tables called committee members and also uses one of 
table names 2 time.Furthermore, instead of using table names it 
uses first columns of each table in generating table name for  createing table statement.I be happy if some expert help me fix this bug in my vba program.Thanks
http://i5.photobucket.com/albums/y180/method007/tablereletionstenissvba1.jpg ( teniss club db reletions )
http://i5.photobucket.com/albums/y180/method007/createtablestatementvba2.jpg (genrated create table statements)
Code:Private Sub CreateTableButton_Click()    Dim T As TableDef    Dim db As Database, cont As String    Set db = CurrentDb()    For Each T In db.TableDefs        If Left(T.Name, 4) <> "MSys" Then           ' 'If T.Name = Me.ComboBox Then                pk = Left(GetPK(T, db), InStr(1, GetPK(T, db), "<-") - 1)                                cont = cont & ShowFields(T.Name) & vbCrLf & " primary key " & pk & vbCrLf & vbCrLf               ''MsgBox ShowFields(T.Name) & vbCrLf & " primary key " & pk & vbCrLf & vbCrLf            ''End If        End If    Next T    MsgBox cont    Call createTextFile("C:createTableStatements.txt", cont)     End Sub
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 7, 2014
        
        How can I plot a line graph for each students to show their progress in a term and per session in a class, in a subject.
Something that can be visibly seen to know how a student is doing in a subject or in a class.
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 8, 2013
        
        I am using Access 2007 with Windows XP. I have a scatter chart embedded  in a form that is plotting data from a subform with a trendline that is extracted and used on the form for  calculations. After having the table set up correctly and running fine, I  closed the database and then reopened it to have the table plotting the  data in a made up 1 to 1 relationship rather than what is in the  datasheet. The only way I have been able to fix this error is to change  the chart type to something else then back to a scatter plot and remake  the trendline. Why this is happening and how to prevent it?
	View 1 Replies
    View Related
  
    
	
    	
    	May 26, 2014
        
        Till now I managed to publish and save all in C:Reports. What I'm trying to do is Save to path specified in Path. DB attached.
Private Sub PrintAll_Click()
Dim db As DAO.Database
   Dim rs As DAO.Recordset
   Dim MyPath As String
   Dim MyFileName As String
[Code] ....
	View 6 Replies
    View Related
  
    
	
    	
    	Jun 10, 2015
        
        I am using Access 2010 in a split database. The intent is to place the back end and associated linked files on a server and the front end on work stations for each user. The typical user will just be searching for information in the database not altering it. My current code re-links the tables once the path is known i.e. I have to hard code it into the global constant. Is there a way in VBA or utilizing VBA to read/write to an ini file (for example) that the UNC path would automatically be updated to a global constant in my current code that can be updated automatically based on where the back end is installed.
Global Const BE_DATABASE = "192.168.2.3FMCENFMCTABLES.accdb"
Global Const BE_PASSWORD = "***********"
Global Const BE_DATABASEPATH = "192.168.2.3FMC" 'used to open files 
Public Sub CreateDatabaseLinks()
          On Error Resume Next        'new
         Dim ws As DAO.Workspace
         Dim db As DAO.Database
         Dim td As DAO.TableDef
         
[code]...
	View 5 Replies
    View Related
  
    
	
    	
    	Mar 5, 2014
        
        I'm importing a txt file using the following code.
Now my question is, how can I make visual basic ask me to select a file to get the path and put it in a string. 
And use this string in the DoCmd.TransfetText
Code:
DoCmd.TransferText acImportDelim, "IN-specification", "tblimport", "C:usersKimdesktop	extfile.txt"
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 10, 2014
        
        I am trying to code a button to select a file path.I get a compile error: User-defined type not defined on the following line;
Code:
Dim fldg As FileDialog
	View 7 Replies
    View Related
  
    
	
    	
    	Jan 12, 2015
        
        Im trying to programmatically (without any user intervention) retrieve the long path name for a given file.  It seems to me this should be a rather easy thing to achieve using Access VBA.  Ive tried using various FileSystemObject methods with no luck.  Ive Googled many variants of VBA get full path without any meaningful hits. provide the first string as a parameter to some object and have it magically return the second string.
String 1: C:PROGRA~2COMMON~1MICROS~1VBAVBA7VBE7.DLL
Stint 2: C:Program Files (x86)Common Filesmicrosoft sharedVBAVBA7
	View 7 Replies
    View Related
  
    
	
    	
    	Sep 18, 2014
        
        For instance, I got some dynamic length path with filename as follows:
 
F:OUTDOOR9-8W1250832 ABCworking 1.3-0.6 BOARD 720.tif
 
Is there any easy way to get only the "working 1.3-0.6 BOARD 720.tif", which is the desired filename. 
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 30, 2013
        
        I am saving my word doc thru below vba code
.......
..........
doc.SaveAs ("Customers.doc")
..........
.......
Which is saving here :
C:UsersashfaqueDocuments
I need to save it to desktop or somewhere I want.
How can I specifically mention the path in my vba code to save this document at the desired place?
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 16, 2014
        
        I need to handle a code to collect a list of files at specified path to be inserted into one table fields: 
file name, extension, date, size...etc
	View 5 Replies
    View Related
  
    
	
    	
    	Jan 29, 2015
        
        I have some code that takes data from my database and creates an email with it. It also creates a folder and a word document. In the email, I would also like to include the file path as a link instead of just the path that it puts there now. Is this possible to do?
Code:
Option Compare Database
Private Sub SendEmail_Click()
On Error GoTo Err_open_word_Click
    Dim oApp As Object
    Dim path As String
[Code] .....
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 10, 2013
        
        I have a front end and a back end access files.My user save the back end on a shared network folder like:a.b.comfolderName$..I wish to simulate this path in my local pc in order to set the linked table links.My problem is that I can not modify my pc name to be "a.b.com".How can I simulate this in my windows 7 pc ..so I can set the linked table values to "a.b.comfolderName$" ?
	View 8 Replies
    View Related
  
    
	
    	
    	Sep 8, 2014
        
        I have a module that I am using to verify that file paths in my table point to valid jpg files.  The table has grown quite a bit since I first created the module and it has gotten to the point where it's taking too long for the module to execute.  I'm in the process of trying to change the record set for the module from the table to a stored query procedure but it's turning out to be a little tricky for me.  When I execute the following module, I'm not getting any error code, it just doesn't seem to do anything at all.  The bits in red are the parts I've changed.  Before that the module executed as I expected it would.  
Code:
 
Sub TestIt2()
    Dim strFileName As String
    Dim db As DAO.Database
    Dim rs As DAO.Recordset
    Set db = CurrentDb()
    Set rs = db.OpenRecordset("QryUpdateRevisionHistory")
[code]....
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 1, 2013
        
        I am trying to write some code to open an existing excel form, populate it, and save it with a custom filename in a directory that is built using variables I have declared.
The only part I am having difficulty with is setting the pathname.  Here is my code:
Code:
    'Build path to save file to
    spath = "S:ContractsGeomatics LABSigned" & Company
  'Build File name
  Filename = "" & reservationNumberforForm & " " & Company & "-Payment Schedule"
     
  'Save the payment schedule to the S: drive
    'xlApp.ActiveWorkbook.SaveAs Filename:="S:ContractsGeomatics LABSigned" & Filename, FileFormat:=xlOpenXMLWorkbook
    xlApp.ActiveWorkbook.SaveAs Filename:="" & spath & " " & Filename, FileFormat:=xlOpenXMLWorkbook
    xlApp.ActiveWorkbook.Saved = True
	View 5 Replies
    View Related
  
    
	
    	
    	Jul 31, 2013
        
        I've recently created a new Access 2010 Database which I'm developing an interface for in VBA. I've created a new Userform in the Visual Studio (this required me to add the Userform button). I'm finding that when I insert the Multipage object which I need to use on the form I can no longer run the Userform. When I attempt to run, I get the error 'Path/File Access Error' followed by 'Run time error 75 - Could not find the specified object'. 
It's definitely linked to the Multipage which I've inserted from the toolbox (standard object) as the form runs fine when it is not there and with other objects (have tested all other toolbox items). There is currently no code in written in the project, no tables or queries set up in the database therefore nothing is running when the form loads.
I've successfully used Multipages in a number of other VBA interfaces both in Access and Excel so not sure why they are causing a problem here. I've also just created a userform in exactly the same way in a new Excel sheet and it runs fine with the multipage.
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 6, 2014
        
        I have some code that attaches any files that are in my attachment field on the current record in to a email this is great but I m starting to realise that this is take up way to much space as it hold a copy in the database and can t afford to go down the sql sever route so what I have done is added some new fields called path1, path2 ,path3 ,path4 and path5 now the user can add the files location to these text box instead of add them via the attachment field also I can now limit number attachments to each record
Code:
Private Sub cmdEmail2_Click()
  Dim appOutLook As Outlook.Application
Dim MailOutLook As Outlook.MailItem
Dim OutlookAttach As Outlook.Attachment
Set appOutLook = CreateObject("Outlook.Application")
[Code] ....
Some how I need to change this so it checks fields path1 path2 path3 path4 path5 on the current record and see if anything is entered in these textbox's and follow the paths and attach the files to email 
How to make command button . How to add a file path to a text box
1. add new field to your table e.g "path1"
2. add the new field to your form 
3 create new command button call it addpath
4 add code below to click on event 
Code:
Private Sub addpath_Click()
  Dim fDialog As Office.FileDialog
   Dim varFile As Variant
    ' Clear listbox contents. '
   Me.Path1.Value = ""
    ' Set up the File Dialog. '
[Code] ....
This will now save file location path to the path1 text box. To open file path
1.add another command button call it "pathopen"
2. add code below on click event 
Code:
Private Sub pathopen_Click()
Application.FollowHyperlink Me.Path1
End Sub
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 20, 2014
        
        I want to pass a string aPath contains path of the active workbook to access vba module or sub. Below is my excel vba code that will open access db form. How do i pass the string value to access vba.
 
Code:
      Dim aPath, aDbase, aDSource, aTable, exePath As String
        Dim fileParam As String
        aPath = ActiveWorkbook.Path      
       aDbase = "near_14.accdb"
      aDSource = aPath & "" & aDbase
[Code]...
	View 4 Replies
    View Related
  
    
	
    	
    	Nov 19, 2013
        
        I am using MS Access 2010. I have a code that I am using that loops through a folder gather all the names of the files in the folder and inserts them into a table (shown below). The table is named "tblFiles" there are two columns in the table titled file name and file path. What I want to do is to also loop through the same folder to find the file path of the files and insert them into the file path column has a hyperlink where users can just click on the hyperlink and the file opens. 
 
Private Sub Form_Load()
Dim fs, f, f1, fc, s
Dim rs As DAO.Recordset
Set rs = CurrentDb.OpenRecordset("tblFiles")
[Code] .....
	View 4 Replies
    View Related
  
    
	
    	
    	Feb 14, 2015
        
        I want to do it bring up a form from which the user can send an email, and on the form is an unbound text box [Text1] in which the user can paste the attachment path.  
Code:
Dim olApp As New Outlook.Application
Dim mItem As Outlook.MailItem  ' An Outlook Mail item
Set olApp = CreateObject("Outlook.Application")
Set mItem = olApp.CreateItem(olMailItem)
' Add the To/Subject/Body to the message and display the message
[Code] ....
So, when I paste the file location into Text box [Text1] I get the Run Time error that the path does not exist or is not valid.  Yet when I use the next line which is the same path, all is OK.
	View 8 Replies
    View Related
  
    
	
    	
    	Dec 30, 2014
        
        I have two different database files. One is 2010 ".accdb" format where I have created a form and the inputs to the form is getting saved as records to an access.mdb file in a shared path.Now if the users want to edit the existing record I should allow them to search their previously submitted record with a unique ID number. 
I know it is possible when we have both the form and table in the same db. But I want to know whether it is possible to search with a unique ID and pull the data from different db in a shared path using a command button?
	View 5 Replies
    View Related