Modules & VBA :: Specify Column From Dropbox
			May 15, 2014
				I am trying to populate an email out of VBA with information from a form.The data that is being pulled for RMA Initiated By in the next to last line pulls the index number instead of the 2nd column which is the name. How can I specify which column to pull from? I checked my properties for the table and the form and the column widths are 0";1" , but I can't figure out how to grab that second column in my VBA code. 
.Subject = "01 RMA Initiated- -Awaiting Arrival of Parts From Customer " & "RMA: " & Forms![RMA_Admin]![RMA_Number]
            '.attachments.Add attmt
            .Body = "01 RMA Initiated- -Awaiting Arrival of Parts From Customer " & "RMA: " & Forms![RMA_Admin]![RMA_Number] & vbNewLine & _
           
[code]...
	
	View Replies
  
    
		
ADVERTISEMENT
    	
    	Jun 23, 2013
        
        I am trying to use followhyperlink as a way to open a link in a browser to a file in a shared dropbox folder. I have a form with a  control, the control is named LinkToDoc it's record source is a text  field in a table. The file path in the table is similar to [URL] .....  I am getting run time error 15, cannot open the specified file. 
Code:
Private Sub cmdOpenFile_Click()
Application.FollowHyperlink LinktoDoc
End Sub
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 29, 2014
        
        I want to access my database from different locations. More than 1 user may be using it at the same time.
Can I put the back-end of a split database in a Google Drive folder or a Dropbox folder and have multiple copies of the front-end for each user in their own location.
I know that Dropbox creates copies if two people update the backend at the same time. What about Google Drive? How does Google Drive handle it.
What are the potential problems of using these two services to share a database?
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 28, 2012
        
        Using Dropbox to host a split database.  Ulimately I would like to create a run version for users with the back end held in a drop box directory.
As an unsplit database everything is working fine on dropbox records are saved in a timely manner and great.
Once I split to FE /BE only some records are saved on the BE and some are dropped.  Was getting conflicted copies of Back end but manged to stop this happening but the records were noit on either copy.
Gave each user their own FE (on a drop box directory) linking to a BE in a sub directory on the same dropbox.   
The key issue is that not all users have access and I don't want them to get into code so want to aim towards a run version.
	View 14 Replies
    View Related
  
    
	
    	
    	Nov 30, 2014
        
        I need to input a string into a column named "EventType". The code should first check if the column "Agent Name" contains any strings. If there is none, it will input "IBM Director" into the EventType column.
Once it has looped through the agent names, the code will then loop through the Details column and input into EventTypes based on what is displayed within the string.
These are the codes that I am using to achieve this, however nothing is being input into the EventType column.
Code:
Private Sub Command11_Click()
    Dim dbs As DAO.Database
    Dim rst As DAO.Recordset
 
    Set dbs = CurrentDb
    Set rst = dbs.OpenRecordset("Final")
[Code] ....
I think the problem lies with the code that checks the agent name. When I removed it, it managed to populate the EventType column based on the details. But I still need to find out how to check the agent name too.
	View 4 Replies
    View Related
  
    
	
    	
    	Feb 28, 2014
        
        I want to convert a number column into a  text column.
Number Column is called Customer.
Below I can't match to the other table containing the text column Customer No.
How can I convert columns in vba?
Code:
strSQL = "SELECT CALCULATED_Forecast_TNS.*, USEFUL.TRP_in_EUR " & _
         " FROM USEFUL INNER JOIN CALCULATED_Forecast_TNS ON (CALCULATED_Forecast_TNS.[Reference No] = USEFUL.[Reference No]) AND (USEFUL.[Customer] = CALCULATED_Forecast_TNS.[Customer NO])"
Set qdf = CurrentDb.CreateQueryDef("REPLACABLES", strSQL)
DoCmd.RunSQL "UPDATE REPLACABLES SET CALCULATED_Forecast_TNS.TRP_in_EUR = USEFUL.TRP_in_EUR"
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 16, 2015
        
        DoCmd.RunSQL (" update tbl_userinformation SET [05-Henrichpiramid] = Yes where Username= Text146.value  AND actualdate=Text148.value ;")
DoCmd.RunSQL (" update tbl_userinformation SET [combination] = [05-Henrichpiramid] where Username= Text146.value  AND actualdate=Text148.value ;")
 
i want to update the column combination to its last value with concatanation to the value of current column.
	View 11 Replies
    View Related
  
    
	
    	
    	Sep 18, 2013
        
        I have a table that contains:
item | quantity
123 | 1
456 | 10
789 | 4
I need to get this data listed into a table that just has item and for it to look like this:
123
456
456
456
456
456
456
456
456
456
456
789
789
789
789
I understand and have accounted for the obvious primary key issue.how to get the data to display out like this.
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 6, 2014
        
        Is it possible to tell VBA to sum up all columns with the column name containing a special string.
For example I want to sum up all columns containg 2013 as a column name.
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 23, 2015
        
        I have a multiple record form that displays fine. However, on the left hand side there is a column that when a record is selected, an arrow appears there. I don't know what this is called in order to suppress it.
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 26, 2013
        
        I have a table with 3 columns (Col1, Col2, Col3).
I have a record like: Col1=A, Col2=B, Col3=C.
I want to be able to do a sort of DLookup but searching all columns for "C" and returning the name of the coloumn "C" is actually in (Col3). 
 
Is that possible at all?
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 22, 2015
        
        I have a table Actions as follow
Action ID    Action
1             cutting
2             sowing
3             ripping 
..            ..
At some time , on clicking the button that opens this lookup table I found some of the values of Action equal to Action ID
Action ID      Action
1               1
2               sowing
3                3
What are all possible scenarios that would lead to Action column taking value of Action ID?
	View 9 Replies
    View Related
  
    
	
    	
    	Jul 29, 2013
        
        I'm stuck on this one part of my code where I am trying to count values in a column called 'ItemQty' in table 'dbo_Item'. I only want to count the values with the associated values in column 'OrderNumber'. I am getting the values of 'OrderNumber' from an array. Here is my code...(it doesn't work though. When I put a Msgbox to print out what the ItemQuantity value ends up to be, it only prints my code back to me.)
Code:
 
For Each Order In q
MsgBox "Order = '" & Order & "'"
ItemQuantity = ItemQuantity + ("count(ItemQty) Where OrderNumber LIKE '*" & Order & "'")
Next Order
	View 3 Replies
    View Related
  
    
	
    	
    	Apr 28, 2014
        
        I am trying to import an Excel spreadsheet into an Access table and running into a snag.  Since the spreadsheet doesn't have column headers, I keep getting Run-time error '2391' - Field '0000000' doesn't exist in the destination table ... my table name.How can I import the data from a spreadsheet so that it ignores the fact that there is no column headers?
 
Here is the VBA/Module:
 
  Option Compare Database
Dim myCheck
Function WebRegistration()
DoCmd.TransferSpreadsheet acImport, acSpreadsheetTypeExcel9, "tbl_TruRewards Web Registration", "R:DEPT-BRCONSUMER LENDINGVISACardholder ActivityWeb Registration_TruRewards.xls", True, "Web Registration!F8:R50000"
End Function
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 16, 2014
        
        Copying a column from one record to another.  Code is:
Code:
                Set fld = Records.Fields("violationLocalOrdinanceNumber")
                If Len(fld & "") > 0 Then
                    rst!LOR_NB = Nz(Records!violationLocalOrdinanceNumber, "")
                    Debug.Print ("LOR NB:" & rst!LOR_NB & "." & " len:" & Len(Nz(Records!violationLocalOrdinanceNumber, "")) & " len new:" & Len(rst!LOR_NB))
                End If
Some of the output I'm getting is:
LOR NB:8.08(5)                  . len:7 len new:25
LOR NB:7.08(5)(a)               . len:10 len new:25
LOR NB:7.08(5)(a)               . len:10 len new:25
LOR NB:7.08(5)(A)               . len:10 len new:25
LOR NB:7.08(5)(A)               . len:10 len new:25
LOR NB:7.08(5)(a)               . len:10 len new:25
LOR NB:8.08(5)                  . len:7 len new:25
No matter what the original string length is, something is adding extra spaces and forcing it to 25 in the new record.  This is the only field I've been able to identify with this issue.  Column definition is char(25), no indexes or anything special that I can tell.
Tried adding a left() function call after the assignment but that didn't work either.
	View 4 Replies
    View Related
  
    
	
    	
    	Apr 1, 2014
        
        I am populating Access table using a stored procedure from SQL Server. Here is the code that does the populating.
The problem area is the rst!id (highlighted in red). This is the Identity Column from SQL Server. When Access gets to 32768 it results in a blank in the Access Table. Ive Included the picture.
When I step through the loop and get to that 'id' I can see that the next value is there, by hovering over 'rst!id'. So I know that the value is not NULL but it does not record it in the table.
This continues for the remainder of the load, which is few more thousand rows.
Code:
Do Until rst.EOF
strSQL = "INSERT INTO tblStationPatronageEstimate (pax,transactions,time_band,day_type,entrance, " & _
" from_date,to_date,id,station_entrance_id,number_of_days,average_pax_per_day,
average_tran_per_day,vr_used_name,vr_used,userid, " & _
" time_stamp, completed,comment) " & _
[Code] .....
The results
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 25, 2013
        
        i want to make a string that contains all of the fields in a column.
I have a table called UserSelectedComponentT with a column called ComponentName.
I want a string that is essentially all the different component names seperated by a " + " . 
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 2, 2014
        
        how can I use the column repmonth in the following statement?
repmonth is as a string declared and given by the user, in my case repmonth = 112013.
Code:
Public Sub TEST2()
DoCmd.RunSQL "SELECT PPC_REPORT.Reporting_Month, Report_Products.Division, 
Report_Products.Product_Class, PPC_REPORT.Sales_Quantity, 
Sales_QUANTITY_BP_2013.'" & repmonth & "' , Sales_QUANTITY_BP_2013.Total, 
Sales_Quantity_'" & CF_PERIOD & "'.' & repmonth & "', Sales_Quantity_'" & CF_PERIOD 
[Code] ......
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 5, 2013
        
        I want to be able to compare two tables to see whether their Column Names & sequence are the same.
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 18, 2015
        
        Is there a way to write a code or query to find the last value in the last Field (column) of a record in a table?
Or find the last field name that contains data, in a record?
	View 5 Replies
    View Related
  
    
	
    	
    	Mar 26, 2015
        
        I'm currently making an Experience Statement for my company. In one of the forms I've created I an Industry sort that is weighted and connected to a table so that it'll show a report based on the numbers provided IE. 1-5 One being shown first and a blank statement not showing on the report at all. 
  
I have the report function working correctly the only thing I would like is a cmd button that clears sort table of numbers so that it doesn't show anything and can start fresh. What VBA code shall I use?
  
I was thinking something along the lines of this, but it's not working.
  
 Dim s as String
  s = "UPDATE All_Projects_Sort_Table SET Industry Sort = Null;"
CurrentDb.Execute s
Requery
  
 Attached are some images ...
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 5, 2015
        
        I am currently having trouble filtering my subform by a different column than the bound column set in properties.
the comobobox shows the ID for the last email sent, with the combobox drop down showing the name and date of email when dropped down. I have tried 2 things and neither work...
1) Calling the filter on the combo-box column itself:
Code:
Dim myDate as string
myDate = [Forms]![BenSearchForm]![BenSearchSub]![LastEmail].[Column(5)]
DateFilt = " AND" & myDate & " BETWEEN " & "Nz([forms]![BenSearchForm].[Date3],#1/1/1900#) AND Nz([forms]![BenSearchForm].[Date4],#31/12/2100#)"
I have used similar code on another form, but I can't get the myDate variable to get to value of the 6th column in the dropdown (Date Of Email). an Easier way to look at this would be:
Code:
DateFilt = " AND [Forms]![BenSearchForm]![BenSearchSub]![LastEmail].[Column(5)]" & " BETWEEN " & "Nz([forms]![BenSearchForm].[Date3],#1/1/1900#) AND Nz([forms]![BenSearchForm].[Date4],#31/12/2100#)"
2) Inside the subform, I have set up a seperate field that reads the result of the dropdown box column(5) and shows it. For example the Email with ID 22 has a date of 4/8/15, so any record with last sent email being 22 has a record that says 4/8/15. I am trying to use this value to filter between, but am unable of passing the value to my filter.
The textbox is called "Email Date" and the Control source is "=[Forms]![BenSearchForm]![BenSearchSub]![LastEmail].[Column](5)"
It shows the correct data, but does not allow me to filter by this field, when the apply filter button is pressed it asks me for the parameter value of the LastEmail Field.
Code:
DateFilt = " AND" & " [EmailDate] BETWEEN " & "Nz([forms]![BenSearchForm].[Date3],#1/1/1900#) AND Nz([forms]![BenSearchForm].[Date4],#31/12/2100#)"
I use a number of set variables for my filters, so my filter ends up looking like
Code:
 .Filter = IDFilt + EmailFilt+ DateFilt
where all but IDFilt begin with AND. I use this on a number of other forms so I am sure this is not the issue!
	View 3 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 13, 2014
        
        I have a table that has just Months in a column. As in January, February......
I want to convert these to Numbers as in 1-12 in VBA. I tried all the DatePart in every combination but can't seem to get the results.
	View 5 Replies
    View Related
  
    
	
    	
    	Jan 12, 2015
        
        I have the below SQL statement... In table2 there is another field called timestamp1... Is it possible to have the timestamp1 included in the below statement so that I will have a record of time the moment the records were inserted in table2? There is no timestamp1 field in table1.
 
Code:
strSQL = "Insert Into Table2(Business_Unit, Account)  Select Business_Unit, Account From Table1"
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 8, 2014
        
        I have column called "order" in table called "mov" and this column has this layout
Code:
1
2
14
255
222
1755
12
And I want to update this column to be corrected numbering from 1 to the last cell number - lets say it 17540 - this update has no criteria conditions, just this field.
	View 4 Replies
    View Related