Modules & VBA :: Rename Table - Append Current Date On The End
			Jul 2, 2014
				I am using access 2010.  I need to rename a table when I import the a new table.   But I can't get the docmd rename code to work.  I also want to append the current date on the end i.e. 
docmd.rename, "tblOldTable(Currentdate)", actable, "tblOldTable"
doesn't work. 
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Jul 16, 2013
        
        I'm having about 100 table with the following name: phres01, phres02, phres03 .....phres100
And I need to rename them to ph01, ph02, ph03 ... ph100 respectively
thus removing the "res" part of each table. Since the ctrl+h doesn't work for access LOL im in hella trouble.
	View 10 Replies
    View Related
  
    
	
    	
    	Feb 25, 2015
        
        I am importing different excel sheets into Access dB using a file dialog. The importing works fine however, I would like to rename the tables once they are imported to the name of the first column heading. Where exactly would I ad the name change at in this code? 
 
#' Open the EXCEL file and read the worksheet names into a collection
 Set colWorksheets = New Collection
 Set objWorkbook = objExcel.Workbooks.Open(StrFileName, , blnReadOnly, , _
       strPassword)
 For lngCount = 1 To objWorkbook.Worksheets.Count
       colWorksheets.Add objWorkbook.Worksheets(lngCount).Name
       
[Code] .....
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 29, 2006
        
        Im trying to make a button that sends the current open record information to another table.  I created an append Query but it is pulling nothing.  Can someone help me figure out how to send the current open file to a seperate table?
	View 4 Replies
    View Related
  
    
	
    	
    	Apr 23, 2013
        
        I have two append queries that I use to archive certain data from two different tables to one archive table.  The queries are run from the corresponding forms of the two tables. I would like to be able to add the form name to the append query.  
That is, if the old data is coming from FrmA, then the Archive table would show that the old data came from FrmA or TblA, etc.  I added a field in the Archive table [FormName]. I know you can call the name of the form by =frm.name, but how do I append this to the Archive table without having to have the Archive form open?
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 17, 2014
        
        I am trying to open a form with some records taken from one table, then alter couple of data in it and after that most importantly to append current records into a different table. The reason I need to append is that I need to keep track on every occurrence on same fields.
 
It looks like this:
 
SerialNumber(Field 1), ServiceDate(Field 2), ServiceEngineer(Field 3)
Now suppose same serial number called again and asked for service, I need to still keep record on how many times this same serial number had service. 
	View 9 Replies
    View Related
  
    
	
    	
    	May 18, 2015
        
        I have form1 that has the current commodity When i need to change the commodity I want the following to happen when they click a button: open the commodity change formthat form has a drop down to select a new commodity and a date of commodity change date fieldWhen the user submits it will move existing value to history along with the Date of change (separate table)Next it will take the value in the new commodity box and make it the current commodity
My thinking is that when i click the button to open the change form I can save the commodity at that time but I wont have the date yet.  Just not sure of they best way to go about this.
	View 6 Replies
    View Related
  
    
	
    	
    	Aug 18, 2015
        
        I am building a database to track contract of employees so that I can know which contracts are valid and which are expired.  
My table has the following fields:
ID (Primary key)
Employee ID (Foreign key to link to the employee table)
Start_Date
End_Date
Status (Either valid or expired)
Challenge
I want when I enter the end date, the system checks the end date against the current date and fills in the status field with either valid or expired as appropriate.  For instance if the contract end date is March 10,2016, the status must be filled in the word valid.
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 14, 2007
        
        Hello,
I was wondering how to check a date in a table vs current date and 
then put a yes/no in a colum if the date in the table is past current date.
In the form I know it should be wrote in the Upon Open Event
But I am unsure of the code.
Thank you for your time,
Derek L
	View 5 Replies
    View Related
  
    
	
    	
    	May 4, 2014
        
        How can i display current time and date on msgbox. in ms access 2007.
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 3, 2014
        
        I have a form that allows you to search for records and displays all the information for that project, typical stuff.
On this form is a subform with the followings Fields:
Inspection Requested, Inspection Due, Inspection Done, Overdue
When you update inspection requested the inspection due is automatically updated to 30 work days from that day.
Now what I'm trying to do is get the overdue field (it's a yes/no field) to automatically check itself when the current date is passed the inspection due and the inspection done field is blank.
Here's what I have that isn't working:
Code:
Private Sub Form_Current()
If DateAddW([REQUEST], 30) < Date And [INSPECT DONE] = 0 Then
[OVERDUE] = True
End If
End Sub
DateAddW is a UDF that works just fine. I've tried replacing 0 with Null and neither works.
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 30, 2014
        
        Encountered a situation where the Date and Time functions in VBA are not using current data?  I have VBA code that uses Time to determine certain actions.  A new associate took a copy of that code and started tinkering with it to complete a project I assigned.  Now, his copy of the code returns old data for the Date and Time functions.  It returns 5/27/2014 for Date and 7:15:42 AM for Time.  The Now function works properly.  
Additionally, running the Date and Time functions in queries works fine.  I've compacted and repaired the Access database, I've checked the references, and I've checked to see if he assigned values to variables named Date or Time, but I don't see anything wrong.  What am I missing? 
	View 14 Replies
    View Related
  
    
	
    	
    	Jun 27, 2013
        
        I have a variable (dtDueDate as Date) showing as 6/28/2013.  I want to append a time value to it (dtMaxTime as Date) which is 5:00 PM so dtDueDate reads 6/28/2013 05:00:00 PM.  I have been going in circles trying to figure this out.  My goal is to append this date to a table field which has a datetime (General Date).
	View 6 Replies
    View Related
  
    
	
    	
    	Apr 7, 2013
        
        I want to create a form that will update several tables at the same time.A field that is important in each table is "ID" and "DATE" date being the current date the record is being created and ID is the Unique ID of user creating the record.These 2 fields should be incorporated in the different tables without the user having to identify himself every day or to add the date all the time ( I want the system date to be automatically used)
	View 4 Replies
    View Related
  
    
	
    	
    	Jul 26, 2014
        
        I am trying to add the current date and time into separate fields after an ID is entered.
Code:
 Option Compare Database
Private Sub ID_AfterUpdate()
Me.Date_Received = Date()
Me.Time_Received = Format(Now(), "hh:mm AMPM")
End Sub
	View 5 Replies
    View Related
  
    
	
    	
    	Mar 8, 2014
        
        I have this table that records sales events for properties, with multiple sales records for some parcels. Each parcel has unique field: MapTaxlot. I want to create a select query or make table query that shows only the most recent sale event for each parcel. Instrument_Date is the date field for the sales records. 
See attached example of the data table below.
What is the simplest method to accomplish this?
TableSnip.JPG
	View 5 Replies
    View Related
  
    
	
    	
    	Feb 26, 2014
        
        I am trying to query my records by the current records selected date then send the results in the body of an email on click. I believe I am close but I think there is a problem with the date format because I am getting 3421 Data type conversion error. Here is what I have:
Code:
 
Private Sub eMail_Click()
On Error GoTo EH
Dim dbExceptions As Database
Dim rstExceptions As Recordset
Dim dbDate As Database
Dim rstDate As Recordset
[code]...
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 21, 2014
        
        I have a form with a listbox that displays the name of a table. Once the listbox item is selected, the table name is set to a variable called myFile. I want append  the records from the table (myFile) into another table.
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 22, 2014
        
        I have a form which i use for a user to select an excel file they want to import and then click a cmd button to import the file into a table which works fine, however i want to append a date into a date field from an unbound txtbx before the file is imported so it will look something like;
id;date;excel info;excel info;excel info.
	View 7 Replies
    View Related
  
    
	
    	
    	Dec 17, 2013
        
        I want to rename a report by clicking a command button on a form. I have this simple code in the click event: 
Dim strReportNameNew As String
Dim strReportNameOld As String
strReportNameNew = txtChangeTo.Text
strReportNameOld = txtChooseReport.Text
DoCmd.Rename strReportNameNew, acReport, strReportNameOld
The code fails with this error message:
Microsoft Visual Basic
Run-time error '29068'
Household Labels cannot complete this operation. You must stop the code and try again.
I am able to rename the report manually.I have searched but been unable to find out what is causing this error. 
	View 6 Replies
    View Related
  
    
	
    	
    	May 1, 2013
        
        I have an database that uses a couple of different date ranges, so I created a table that shows the different date ranges that may be required (xReport Dates) so I didn't have to keep manually editing queries or entering dates every time.
I have one query that appends data from one table into another based on a date range that you need to manually enter when prompted; I can't seem to get it to refer to my xReport Dates table for the range.
Its currently set up as below:
INSERT INTO 001_M_Gross_Telesales ( UpdateDate, OMSNumber, MediaRoute, ExecName, SaleType, Name, 
[Reporting Campaign], [Reporting Team], [Sales Leader], [Reprting Name], [Media Route2] )
SELECT Max(L_ExecTracker.UpdateDate) AS MaxOfUpdateDate, L_ExecTracker.OMSNumber, 
L_ExecTracker.Campaign, L_ExecTracker.ExecName, L_ExecTracker.SaleType, Z_Ref_Agent_Table1.Field23, 
[Code] .....
	View 1 Replies
    View Related
  
    
	
    	
    	Dec 13, 2013
        
        I'm using 2013. The first version of my code works great. It opens the correct report and attaches it to an e-mail as a pdf with all of my text etc.
 
Code:
 
Private Sub btnEMail_Click()
On Error GoTo errHandler
    Dim strReport As String
    Dim vMsg As String
    Dim vSubject As String
    Dim strWhere As String
    strReport = "RptJobDSD"
 
[Code] ....
The problem I have is I would like to rename the pdf, so instead of "RptJobDSD" everytime, it can have some fields [DSDDate] and [JobID] etc. 
Before trying the fancy field stuff I thought I'd try just "DSD Test" and see if I could rename it in the first place! 
 
I added this and am getting - Error(32004) - The control name 'RptJobDSD' is misspelled or refers to a control that doesn't exist.
Code:
 
DoCmd.OpenReport strReport, acViewPreview, , strWhere
    DoCmd.SetProperty strReport, acPropertyCaption, "DSD Test"
    DoCmd.SendObject acSendReport, strReport, acFormatPDF, , , , vSubject, vMsg, True
My confusion comes as the OpenReport and SendObject recognise strReport why doesn't SetProperty?!
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 25, 2013
        
        This code is supposed to loop around a directory of photos (named after a project), and then copy a new photos (from another directory) to this folder, numbering them and the logging them in a table tphotos.The first time a copy photos to a new directory the code works fine. And I think I had it working fine before, but now when I copy photos to a pre-existing directory that has already photos, it only overwrites the first photo, instead looking for the last photo and attributing the new photo number n+1.
I've done debug.print in the code, and it looks like is not going into  If NewFileName = f1.Name, therefore doesn't compare the newfilename with the files in the folder.
Code:
Private Sub cmdAddPhoto_Click()
Dim fs, f, f1, fc, s
Dim fDial As FileDialog
Dim SourcefileName, destDir, FileExt, NewFileName, prjID As String
Dim intSel, FileNumber As Integer
Dim varSelFile As Variant
Dim rsPhoto As Recordset
Dim myDB As Database
[code]...
	View 5 Replies
    View Related
  
    
	
    	
    	Mar 7, 2015
        
        I have a form, has some fields, one of them is the current date, so when the user click (save )button , which make (add new record )to the only table I have the problem that .all fields are inserted in the table , except the current date !! it is a text box ( Now() )!!
	View 1 Replies
    View Related
  
    
	
    	
    	Feb 14, 2014
        
        I have the following code, the purpose of the code is that to take all rows from each table to append them into one table. However, I am testing this code with 2 tables (Table2 and Table3) each table has 2 records, when I run the code, it keeps adding records to table 1 that exceeds one million. what is wrong with my code?
Dim tblString, I As Integer
        Dim rstFrom As Recordset, rst2 As Recordset
        Dim db As Database        
        Set db = CurrentDb
        Set rst2 = db.OpenRecordset("Table1", dbOpenDynaset)
[Code] .....
	View 3 Replies
    View Related
  
    
	
    	
    	Dec 11, 2013
        
        I want to append data to the FC_TEMP table with the condition that the time_period is same on FC_TEMP and Scrap_Sales_Forecast table.Somehow it asks me to type in a parameter for Time_Period on FC_TEMP.
Code:
'Append Scrap Sales forecast to actual FC_TEMP table
Public Sub Append_Scrap()
DoCmd.RunSQL "INSERT INTO [FC_TEMP] SELECT Scrap_Sales_Forecast.* FROM Scrap_Sales_Forecast " & _
             " WHERE FC_TEMP.[Time_Period] = Scrap_Sales_Forecast.[Time_Period]"
End Sub
	View 3 Replies
    View Related