Modules & VBA :: Relink Multiple BE Files / Locations Depending On User Windows Login

Mar 20, 2014

Access2007

At this point, FE db has 4 linked tables, 3 are located in FileBE1, and the 4th is located in FileBE2.

The production BE is located on a server, the test (when working remotely) is on a local computer that is not able to connect to the server. Also, the test BE files (but not the table names) have different names than the production.

I have the idea of creating a table in the Front End that contains a list of users, filename and location (server or local drive).

Upon startup, how could I set up the vba to check the links and if they need to be changed will go and change them without the user having to click on link table manager or be prompted for names and path.

For now, I envision three rows in the table, one for the test user, one for local user and a default UNC for everyone else. (or would it be six rows since there are two files that need link checking and relinking).

View Replies


ADVERTISEMENT

Customised Reports Depending On User Login

Nov 22, 2006

I want to print different versions of a report depending on on the user login id "quserid" which I have on a login form "authorise".

As a simple example I have tried using a single user with the syntax shown below but get an error message "Object required". I suspect the problem is in the way I identidfied the quserid field. Can anyone please advise me on this.
Regards
Peter

If AUTHORISE.quserid = "ADMIN" Then
Dim stDocName As String

stDocName = "FUNDING CONFIRMATION LETTER"
DoCmd.OpenReport stDocName, acNormal
Exit_PrintConfirmationLetter_Click:
Exit Sub

Err_PrintConfirmationLetter_Click:
MsgBox Err.DESCRIPTION
Resume Exit_PrintConfirmationLetter_Click
End If

View 1 Replies View Related

Modules & VBA :: Retrieving User Name Logged Into Windows?

Sep 20, 2013

Continuing with production of my database I've come across another wall that I'm trying to pass. My aim is when the user press the "Quit" button it will export everything to a file which is stored on Google Drive as google drive is installed on the laptops that will be using this database.

However the problem is Google drive is stored in the computer user files i.e C:UsersstudentGoogle Drive - is there a way to retrieve the name of the user that is logged into windows?

Code:

Private Declare Function GetUserName Lib "advapi32.dll" Alias "GetUserNameA" _
(ByVal IpBuffer As String, nSize As Long) As Long
Private Declare Function GetComputerName Lib "kernel32" Alias "GetComputerNameA" _
(ByVal lpBuffer As String, nSize As Long) As Long
Function ThisUserName() As String
Dim LngBufLen As Long
Dim strUser As String

[code]....

However cant get this to work - I think that is probably because i'm declaring this code in the wrong place - I've tried declaring the private functions in a class module and the functions in a module - however no success - How do you set this code up? Or is there a new way to do this?

View 14 Replies View Related

Modules & VBA :: Tracking User Login / Logout

Mar 11, 2015

where I can find VBA for (Tracking User LogIn/LogOut) I have tried researching to no avail.I just need a simple code to track users logging date & time in and out of my DB.When they click on the icon on the desktop id opens the DB to login screen with username & password then into the DB.

View 9 Replies View Related

Modules & VBA :: User Login Form With Different Levels Of Access?

Feb 21, 2015

I have recently started a project and become stuck already. I have a login form created that works (code below). What i want to do is allow access to the users of 1-7 in table (level of access) which will determine which page they view after logging in. IE if the have Access in table "Users" as "1" then when they log in the will see a form thats called L1. Same with 2,3,4,5,6 & 7.

Code:
Private Sub LoginButton_Click()
If IsNull(Me.LoginUsernameText) Then
MsgBox "Please Enter Username", vbInformation, "Username Required"

[Code].....

View 5 Replies View Related

Modules & VBA :: Create A Login Form That Allows User To Change Temporary Password

Feb 25, 2014

I have been trying to create a login form that allows the user to change his/her temporary password logging it to the proper table along with timestamp and who done it info.But, after spending the morning trying to find the proper syntax I am flummoxed.

I can get everything to work accept the update of the fields. I can get the command to work (writes to the location) but it does the pop-up what is the parameter thing when it works. I have all the information just need to get it in so the command recognizes it.

DoCmd.SetWarnings False
DoCmd.RunSQL "UPDATE lut_TeamList SET Pass = txt_Password.value WHERE TeamListID = Me.cbo_UserName.Value"
DoCmd.RunSQL "UPDATE lut_TeamList SET UpdatedBy = Me.cbo_UserName.Value WHERE TeamListID = Me.cbo_UserName.Value"
DoCmd.RunSQL "UPDATE lut_TeamList SET UpdatedWhen = Now() WHERE TeamListID = Me.cbo_UserName.Value
DoCmd.SetWarnings True

View 5 Replies View Related

Modules & VBA :: Hide 5 Buttons Depending If User Has Permission Which Works Fine

May 14, 2014

i have the following code that hides 5 buttons depending if the user has permission which works fine.im trying to incorporate an IF statement if there is only 1 of the buttons visible then to automatically click the button. but if there is more than 1 do noting?

Code:

Private Sub Form_Open(Cancel As Integer)
Dim rsO As DAO.Recordset
Set rsO = CurrentDb.OpenRecordset("SELECT tblUserPermission.UserFK, tblUserPermission.CompanyFK, tblUserPermission.Permission " & _
"FROM tblUserPermission INNER JOIN tblUser ON tblUserPermission.UserFK = tblUser.UserPK " & _
"WHERE Username = '" & Me.txtName.Value & "'")

[code]...

View 3 Replies View Related

Setting A Field To Editable Based On Windows Login

Dec 18, 2006

I have a field within a form, which I want all the users of the database to see, but I only want it to be editable if your windows logon name is one of the following:

kleaves
jbloggs
Jsmith

I know I can use the environ variable - environ ("username") and I think I should set this code under the properties of this field possibly the on click setting. Can anyone help?

The reason why I want to do it by Windows logon as this form is widely used by many people and there is no logging into the form at startup. I currently have set the changing of this field to be recorded in a historical view, But I still need to restrict the entry to this field.

View 7 Replies View Related

Modules & VBA :: Import Multiple Files To Multiple Tables On Button Click

Sep 20, 2014

I made a database that in one of the forms, I like by clicking on a button the user be able to select 5 excel files with different file names (in the same directory) and then based on the imported file's names, it be stored in 5 different tables.

At the moment by using the bellow code, I can import multiple files (with the same formats) only into one table . My vba code comes as follow:

Function GetAllFiles()
Dim fd As Object
Dim strFilter As String
Dim lngItems As Long

Const msoFileDialogOpen As Long = 3
Const msoFileDialogViewDetails As Long = 2

[Code] ....

View 4 Replies View Related

Modules & VBA :: Import Multiple Fix Width Text Files - Eliminate Multiple Headers And Footers

Aug 1, 2013

I am trying to build a newer database 2010, based on an older one,2000, that has been locked tight and I cannot see the modules to kinda get a reference of where to start. I am trying to find a VBA code that will allow me to import a several text files to one table. The text files are all in the same format but I cannot remove the page headers and footers to get the table to look right. I have attached an example of the text file i am trying to import but it is a stripped down version for information protection.

Also, it appears in the old Database Table once imported as:

J.Smith 1234 01 ABCD ABCD HGJV 2345 ABCDE ABC6 Qual Date Date
J.Smith 1234 01 ABCD ABCD HGJV 2345 ABCDE ABC6 Qual Date Date
J.Smith 1234 01 ABCD ABCD HGJV 2345 ABCDE ABC6 Qual Date Date
J.Adam 1234 01 ABCD ABCD HGJV 2345 ABCDE ABC6 Qual Date Date
J.Adam 1234 01 ABCD ABCD HGJV 2345 ABCDE ABC6 Qual Date Date
J.Adam 1234 01 ABCD ABCD HGJV 2345 ABCDE ABC6 Qual Date Date

If I could import the text files and end up with a table like this, it would be all i need as i could run all the queries i need from this.

View 3 Replies View Related

Selective Data Acces Depending On Login

Jan 11, 2006

I have a two level security system to protect my date. The first uses the MS Access security, the second is a simple login system wherby a user enters their name and personal password to gain a customised view of the data eg if the user is me, I can see all tool bars, other users cannot. What I would like to be able to do is write a query wherby I can use the users login details to diplay only their data. An example of the script I built is as follows

'IF USERNAME AND PASSWORDS CORRECT THEN LOGIN TO THE MAIN SWITCHBOARD

If Me.qpwd.Value = DLookup("PWD", "AUTHORISED", "USERID = '" & Me.quserid.Value & " '") Or UCase$(Me.qpwd.Value) = "abcd" Then
DoCmd.Close
DoCmd.OpenForm "Course Booking System"
Else
MsgBox "Invalid Password"
End If

Is there a way of including a select criteria like the following

SELECT USERID, DETAIL
FROM COURSE
WHERE USERID="Me.qpwd.Value"

I have tried several differnet versions for this syntax without success!

Any help would be greatly appreciated.

Regards

Peter

View 3 Replies View Related

Modules & VBA :: Moving PDF Files To User Specific Folder

Feb 11, 2015

I'm Trying to move PDF Files associated with a customer to there specific folder

The query gathers the data, Gives me a list of files by account number

Now I want to use the results of the query to move those files

View 5 Replies View Related

Forms :: Restrict User Input In Textbox Depending On What Option User Has Selected

May 22, 2013

I am building a form in access and I am trying to find a way where user input isn't possible in the associated textbox when "No" from on option box is selected.

View 3 Replies View Related

Opening MDB Files Under Windows 7

Aug 8, 2012

I have a PC with Windows 7. I installed Access 2003 (which opens OK) but .mdb files will not load ie my old saved Access files. How can I load these files into Access 2003?

View 1 Replies View Related

Multiple Stock Locations

Nov 21, 2006

We have a stock situation, where the balance on hand is calculated by taking into account receipts and issues/sales from a historic balance.

how do stock systems like this normally deal with stock that can be located in multiple locations.

sounds very hard to me!

Thanks in advance

View 10 Replies View Related

Modules & VBA :: FTP Multiple Files Using Loop

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

Modules & VBA :: Printing To Multiple PDF Files

Jul 8, 2013

My report has tens of pages and I need to save each page as separate file with ID as filename. PDF prints with ID but all in one file. I use this code.

Option Compare Database
Private Sub tisk()
Dim cesta As String
Dim kod As String
Dim Sql As String
Dim rs As Recordset

[Code] ....

View 5 Replies View Related

Modules & VBA :: Importing Multiple Text Files?

Dec 17, 2013

Currently I have a code that imports a single text file into a table without problems.

I need to be able to selecte multiple text files and import them at once.

Here is my current working code.....

Code:
Private Sub Import_Click()
Dim strFilter As String
Dim strInputFileName As String
strFilter = ahtAddFilterItem(strFilter, "Text File (*.txt)", "*.txt")
strSaveFileName = ahtCommonFileOpenSave( _
OpenFile:=True, _
Filter:=strFilter, _
DialogTitle:="Please select new file...", _
Flags:=ahtOFN_OVERWRITEPROMPT Or ahtOFN_READONLY)
DoCmd.TransferText acImportDelim, "Import Specs", "Data Table", strSaveFileName, True, ""

View 14 Replies View Related

Tracking And Receiving Inventory In Multiple Locations?

Jun 16, 2012

The company I work for has inventory at our physical location (our shop) and we also have inventory on trucks. I need to track the inventory in the shop and trucks so that when items get below a certain preset level I can run a report to find out how many of each part I need in each location. Create purchase orders and receive the inventory to whichever location I need it at. I would like to at some point be able to track where the parts are going.

View 1 Replies View Related

How To Store Multiple File Locations In A Text Box

Dec 15, 2011

I've implemented on a form a Command Button that opens up a dialog box to allow the user to find a photo and once the photo is selected, it stores the location in a text box, (not the photo, just the location). I need to be able to allow multiple photo's to be store in the same text box. That was one of the benefits of using an Attachment data type but based on lots of comments...

View 3 Replies View Related

Modules & VBA :: Importing All Records From Multiple Files (ACCDE)

Jul 25, 2013

I have a few hundred access databases all with the same tables and structure, and want to import all the data in a 'mother' database (which i created with the same tables and structure).

I am using a sub that feeds a string to another public sub as follows:

Code:
Private Sub cmdImport_Click()
Dim strFolder As String 'source folder path for import
Dim strFile As String 'individual file path
strFolder = GetFolder(Environ$("USERPROFILE") & "Documenti")
If Len(strFolder) <= 1 Then Exit Sub

[code]....

View 3 Replies View Related

Modules & VBA :: Recordsets - One Access Report To Multiple Files

Sep 9, 2014

I have parameter form that ask for state and begining date. on click it runs a query and creates a report by state that has multiple pages.. I want to create a separate pdf file for is page (which would be by delegate_name).

This is the coding I have so far and am gettting the error '424' object required. This is the coding I currently have. I haven't worked with access in over 9 yrs so am a little rusty with it.

StateAbb = Me.State
PeriodStartDate = Format(Me.Period_start_date, "MM-DD-YYYY")
Dim strSQL As String
Dim db As Database
Dim rs As Recordset
Dim strRptName As String

[Code] ....

View 14 Replies View Related

Modules & VBA :: Import Data From Multiple Excel Files

Apr 24, 2014

I have a requirement to create a piece of vba that will open all xlsx files in a folder one at a time then import the data in a range (sheet1!A1:G14) into a table named Weekly Input.

View 4 Replies View Related

Modules & VBA :: Operate Macro On Multiple Files In A Directory

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

Queries :: Summing Quantities Of Same Product In Multiple Locations?

Sep 30, 2014

I have a transactions table which records a qty number (- or +) and references particular location details (location, room, rack, shelf etc). My question is how do I sum the qty for the same product at different locations. So my user sees that product A has a qty of X in location C and qty Y in location D. I can sum the transactions table qty which does give me a sum based on a single location but each location has multiple racks, shelves etc. I need to know the sum of transactions for the same product for exactly the same location, room rack etc

View 3 Replies View Related

Modules & VBA :: Code For Multiple Reports And Files To Email From A Record?

Nov 20, 2013

i have a database which has new customers added daily (currently we post all documentation)

when a new record is filled in the customer receives:

cover letter/invoice(report), book page(report) and a book (pdf, always the same) the reports are created from the record

rather than post all these documents i would like to email them to each customer in 1 email with the reports in pdf format.

Example:

CC (email feild from the record)

Subject (pre filled with "Stop Bullying Now! Books 4 Schools order")

Body (pre filled with "Dear ([Contact]if possible) Please find enclosed your documentation for your recent telephone order bla bla bla and our logo.jpg if possible)

then i would like to attach to the email the cover letter/invoice(report), book page(report) and the book (pdf) from the hard drive (r.eports changed to pdf)

if i can press a button on the form to send it that would be good.

if i could link it to a query to send a batch of them that would excellent.

The Database is Named: b4s.mdb
The table is called: Main Table
The input form is called: Client
The letter/invoice report is called: b4sletinv
The Book page report: b4sbook
The pdf book is located at c:Documents and SettingsAdministrator4sfinal.pdf
The query for the batch is called: coverlet&proforma

View 2 Replies View Related







Copyrights 2005-15 www.BigResource.com, All rights reserved