Modules & VBA :: Link Access To Active Directory
			May 8, 2014
				I want to link into the active directory to get a list of staff usernames, so it will update the user table as new members of staff are created etc. We currently have around 130 staff, so rather than manually updating the user table i want it to pick up the usernames from AD?
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Apr 26, 2005
        
        Hi All
I have a small Help Desk db with tables that contain computer spec and user information. But I already have all this information in Active Directory and it seems pointless entering the information twice.
Is there any way i can get the database to lookup the information from Active directory i have no idea where to start. 
Thanks
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 20, 2015
        
        I have a database that, I would like to add a button that performs a active directory lookup. I would like it to check a username with Active Directory, and auto populate a few fields. 
 
First Name
Last Name
Manager 
Department
 
This is my first database and I have very little exp using VBA. 
	View 7 Replies
    View Related
  
    
	
    	
    	Nov 28, 2013
        
        How to send an email using access but how to get the emails address that are in the active directory...
	View 14 Replies
    View Related
  
    
	
    	
    	Apr 29, 2005
        
        I know the is probably wishful thinking, but is it possible, and if so how, to link or create groups from Active Directory for use in Access.
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 10, 2013
        
        I would like to get a list of all the users in the active directory and put them in a combo box. How to do this? I would like it to show there CN name
	View 9 Replies
    View Related
  
    
	
    	
    	Jun 25, 2013
        
        how to restrict access to forms and reports using the Active Directory. It is a pretty simple method to pick up and easy to use in any database. My problem comes when I try to apply this same method to tables and queries as well.
	View 5 Replies
    View Related
  
    
	
    	
    	Jul 31, 2013
        
        I'm trying to tie a from into the results from and AD Query. I'm not that experienced with doing this kind of thing so I may be going about this the wrong way. Anyway here's what I've got so far:
Code:
Private Sub Form_Open(Cancel As Integer)
   Dim cn As ADODB.Connection
   Dim rs As ADODB.Recordset         
   Set cn = New ADODB.Connection
   With cn
    .ConnectionString = "Provider=ADSDSOObject;Trusted_Connection=yes;"
[Code] .....
When stepping through the code, it all goes well until it hits the line that actually connects it to the form "Set Me.Recordset = rs".
When this line is executed, Access crashes and attempts to restart.
PS: Access 2010, Win7 64bit
	View 5 Replies
    View Related
  
    
	
    	
    	Oct 7, 2012
        
        By the way, my FO line manager wants an IT report, i am wandering if there is any possibility to search and export users. The report should show in the status column who are disabled, who are enabled, date created and date expired in date column in active directory windows server 2003 environment?
	View 1 Replies
    View Related
  
    
	
    	
    	May 4, 2014
        
        I am using Access to save an Excel file in a particular directory. The  code was created about 10 years ago and hence saves the file with .xls  extension and I would like to save with a .xlsm extension. If I just change the  .xls to .xlsm, in the code below, the  file is saved but the Compatibility Checker comes up (I would like to  stop this) and when the file is reopened I get an error message stating  there is a file extension problem and the file won't open.
Code:
strExt = ".xls"
            'If .txtFriendlyName <> "" Then
            '    strDestFileName = .txtFriendlyName
            'Else
            '    strDestFileName = Left(objFile.Name, Len(objFile.Name) - 4) & MakeFilePosfix(Now())
[Code] ....
	View 7 Replies
    View Related
  
    
	
    	
    	Apr 17, 2014
        
        I have a question about the best way to go about linking an excel workbook to an ms access table?  I have researched hyperlinks and attachments and ole objects and I am not sure what is the best option.  I believe hyperlinks will be best, because the attachments will bloat the database, but I am not sure how to go about doing that in vba?  My process is such:
1)Users enter project information
2)Users enter the sample information for each project
3)The project and sample information is combined by a query
4)The user clicks a button to print forms, which runs the query and opens an excel workbook template. 
5)The data is exported to a specific sheet in the workbook
6)Using vba in excel, the data is used to populate cells in different sheets depending on critera.
After all of this is accomplished, I need the user to SAVE AS the excel workbook and it needs to be "attached" to the ms access 'project' table.  I am not sure what is the best way to link this back to the database.  I would like to automate it with vba if possible.
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 5, 2014
        
        I am trying to set up something to be able to take me to a folder that holds various forms for personnel.  I have a query that generates the link for each person.  I have tried to set it up as a hyperlink in ACCESS 2013 and it displays as one but doesn't act like one.
 
I want to be able to click the link and have it open up a personnel folder for that individual.  I can't find a MACRO that I can create to do it.  Example of my query is that it creates a link K:Main BreakdownSection BreakdownPersonnel FoldersName and the name is the variable part.
 
My next problem will be to have it create that folder when we have new personnel arriving.
 
I would also note that I have not worked with ACCESS in many years and much of what I was able to do with 2002 and 2003 doesn't work with the newer versions of ACCESS.
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 5, 2014
        
        come up with the below code to create PDF documents based on a query.  It has been working great but I have a change that I need to make and can't figure it out.  The code below creates all the documents in one folder "serverD$DocumentsInvoices" but I need it to create a separate folder for each PDF so that the file (Invoice1234.pdf) will be in the folder (serverD$DocumentsInvoicesInvoice1234Invoic  e1234.pdf).  That folder does not exist, so I need to create it and then save the PDF into it.  
Code:
Dim db As DAO.Database
Dim rst As DAO.Recordset
Dim qdf As QueryDef
Set db = CurrentDb
Set qdf = db.QueryDefs("Invoice_Report")
Set rst = qdf.OpenRecordset
[code]...
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 25, 2013
        
        I'm trying to check a directory for a folder name which has a certain string in it (RecNum)
 
However the fso object filesys.FolderExists does not take an argument when looking for part of a folder name on a particular path. 
 
What I basically want to do is look in a directory for a folder with the RecNum variable as part of the folder name. if it exists open it, if not create it.
 
This is how far i've got:-
 
targetdir = targetpath & RecNum & ChannelPartner & Enduser 
 
Set filesys = CreateObject("Scripting.FileSystemObject")
If filesys.FolderExists(targetdir) Then GoTo function_end
MkDir targetdir
If filesys.FolderExists(copypath) Then
filesys.CopyFolder copypath, targetdir
End If
MsgBox ("folder created")
function_end:
 
Shell "Explorer.exe /n,/e," & targetdir, vbNormalFocus
	View 6 Replies
    View Related
  
    
	
    	
    	Aug 28, 2013
        
        I have some code that resides in a button on a report that allows me to save a PDF version of this report.  My problem is that if i have the destination directory open on windows explorer, i get a runtime 2501 "The output To action was cancelled" error.Is there any way to check if the directory is already open, and cancel the output to, or close the window to avoid this error?
Here is my code:
Code:
Private Sub CmdSavePDF_Click()
Dim MyFileName As String
Dim MyPath As String
'Dim CompanyName As String
[code]...
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 6, 2013
        
        I am using a API to generate a random / unique directory. This an API form a 32-bits environment.
 
I know that you can still use it when declaring it with PtrSafe
This is the code I am using:
Option Compare Database
Private Declare Function GetTempPath Lib "kernel32" Alias "GetTempPathA" (ByVal nBufferLength As Long, ByVal lpBuffer As String) As Long
Private Declare Function GetTempFileName Lib "kernel32" Alias "GetTempFileNameA" (ByVal lpszPath As String, ByVal lpPrefixString As String, ByVal wUnique As Long, ByVal lpTempFileName As String) As Long
 
[Code] .....
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 30, 2015
        
        I have created a form that will print the active report.  I have managed to make it look for the active report, but it won't find it because there's no report active, even though I have the report open.  How do I make my report be active when I open it?  (In a way that whichever report I open will become the active window so that my form will e-mail the report that is currently open)
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 15, 2015
        
        When creating an incoming inspection database, I want to set it up so when I am in a form to add data, I want to have a command button where I can pull up the associated CAD drawing based on part number and drawing number.  I would like to enter the directory location into a table so I could change it if I need to.
So basically I want to go something like this:
.tblDirctoryLocation
txtDirectory
.tblProduct
txtProductName
txtProductNumber
txtProductCADNo
These tables would not be related to one another as there will only be one record for the directory location and multiple records for products.
Somehow I want the db to assemble file location like this: 
“EQuality_DirectoryIncoming” & “ProductNumber_” & “CADDrawing” & “.pdf”
End result: EQuality_DirectoryIncomingProductNumber_CADDraw  ing.pdf
Is there any way this could be done?
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 1, 2014
        
        I'm using a function to find all files/folders in a specific directory, then copy each one to a specific destination folder. I'm going to use this on a weekly basis to backup files on a computer. I would like to use the vbarchive in GetAttr/SetAttr so I only need to copy these if they have changed since last backup.
Something like:
If GetAttr(strFile) And vbArchive = 32 then
filecopy xxxx, xxxx
else
rs.movenext
As I understand it, a value of 32 indicates that the file has been modified since it was last backuped up (i.e. since the file attribute was "reset").  How do I "reset" the file attributes to clear the vbArchive??  I've read some google searches and the only thing I could find was the files were set to vbnormal however I'm concerned that this will erase program files that are vbReadOnly or VbHidden.  
	View 5 Replies
    View Related
  
    
	
    	
    	Dec 22, 2014
        
        Is it possible in access, to create a button that will copy a file to a new directory? Specifically, the data field in question is an access hyperlink that we can click on to open a PDF drawing of a part.  I just want to copy the file the hyperlink points to, into a new directory.
EX:
X:database/drawings/somefile.pdf
X:erp/drawings/somefile.pdf
I don't think a macro can do this, but perhaps vbscript can.
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 21, 2015
        
        I have contract notes files in .xls format towards sale of equity shares from the brokerages. I have to do some editing in these files like deleting some rows, adjusting width of columns and inserting date of contract.
a) Contract-A.xls shows original file.
b) Contract-B.xls shows modified file
c) VBA macro code used for deleting rows and modifying column width is shown in modify_contractnotes.xlsm file.
d) Presently I open the file and copy and paste the contents on the macro-enabled workbook sheet . After macro operation I transfer back the contents by copy and paste to a master file(Contract-C.xlsx) and clear the contents in the macro enabled workbook to make it ready for another operation.  
e) It is time consuming process for around 60 files per month.
f)After this operation I run RDBMerge add-in to consolidate and normalize all these files in a directory. RDBMerge smoothened out merged cells also.
Is it possible to have a macro-enabled workbook open all the time and the contract files be opened one after other and macro contained in macro enabled workbook by modifying its code suitably operate on these contract files.
Files are attached in modify_contractnotes zipped folder.
	View 4 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
  
    
	
    	
    	Nov 30, 2005
        
        Hi, I wish to open a folder/directory (not a file) using the onclick event of a cmdButton.  Any ideas out there?
Robb:D
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 20, 2004
        
        Hello creators,
 
I have a little problem and it is creating and checking directories.
 
In my database I have a form, on it you can see a record of a project. This project has a keyfield called projectno.
On this form there is a button to create a directory with the projectnumber. So far so good. (code example: MkDir ("C:projects444323")
 
My problem:
If the directory for some reason already exist the code stops and gives an error.
 
Now I want to create some code that checks if the directory already excist so than I can skip making the directory.
 
Thanks for the help!!!!!
	View 2 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
  
    
	
    	
    	Jun 17, 2013
        
        How do I direct the ZipFilePath and ZipFolderPath to use a directory I define in a textbox in a form? Instead of hard code like it is now?
Option Compare Database
Option Explicit
Public Sub NewZip(ZipFilePath)
On Error GoTo Err_NewZip
Dim lngFile As Long
lngFile = FreeFile
[Code] ......
	View 2 Replies
    View Related