Modules & VBA :: Tell If Browser Is Open To Certain Url?
			Oct 20, 2014
				I want to find out how I can write VBA to find out if a default browser is open to a particular webpage.  I guess I'm going to have to find the browsers handle but I also don't know where to go from there.  
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Oct 8, 2013
        
        From access I'm calling a code in excel. My code in excel pops up a browser that allows the user to select what files they'd like to import. For various reasons I have to import data through excel, not directly to Access which is why the browser appears in excel instead of access. Essentially the user will select a word file which is imported into access through excel.
I'd like this browser to appear in access instead of excel though. If I move my browser from excel to access is there any way to have my code in excel reference the file selected in access? Or is there some way for this browser to appear without the user having to select the excel icon in the task bar? I essentially want the user to only see and interact with access, but because my browser is in excel this isn't possible right now. 
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 27, 2014
        
        If I have an XML file, I can load it into an XML document and parse it.
For an HTML file, I have been unable to find similar parsing methods - that is, using DOM and not involving a browser (other than simply treating the file as text). I'd prefer to avoid the browser control because it is different for a number of different Access versions, so the only option remaining that I see is to run Internet Explorer with visibility off.
Can one parse HTML using the DOM without a browser? 
	View 8 Replies
    View Related
  
    
	
    	
    	Oct 16, 2013
        
        I have constructed an application in Access2010 that uses the ActiveX WebBrowser Control.I am using the Web Browser control to navigate a website that only allows one session at a time and normally (if using a regular web browser) if you close the tab you're working on, you have to completely close the browser and reopen it to be able to acces the website again.
 
I have this application on 2 networks.
 
On PC 
A) when using the WebBrowser control I can navigate to the site. But if I need to navigate away or need to log in as a different account on the site, I can close an reopen the form and that will suffice to regain access to the site.
 
However on PC 
B) it will not allow me to navigate back to the site by closing and reopening the form (the website recognises it is not a new session). I have to close the entire database and reopen it to get the site to work again.
 
I would very much like PC  B) to be behaving in the same manner as PC A) so that I do not have to tell users to restart the whole database in order to reaccess the site.
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 25, 2007
        
        Hi Folks -
 I'm really close at getting what I need done, I just have a small bug.
 I have a form with a web browser control in Access 2003.
 
 One text box on the form is for an address.
 One text box on the form is for the street.
 A command button on the form navigates to a website where I am trying to input the values of the text boxes into the text boxes on the web page.
 The following code:
Me.WebBrowser0.Document.All("EnteredAddrNmbr").focus
Me.WebBrowser0.Document.All("EnteredAddrNmbr").Value = txtaddr
Me.WebBrowser0.Document.All("EnteredStreetName").focus
Me.WebBrowser0.Document.All("EnteredStreetName").Value = txtStreet
Me.WebBrowser0.Document.All("GetPrecinct").focus
Me.WebBrowser0.Document.All("GetPrecinct").Click
This works - but FIRST I get an error 91 on the first line here stating that the Object variable or With block variable is not set. It lets me debug the code as it's running, showing me the highlighted first line in error. I then click the Continue button in the code window and all the rest of the code executes fine. 
 How do I get past that first error? And why is it letting me continue afterwards without addressing the error?
 If I do a On Error Resume Next, it doesn't fill the boxes with data or issue the Click event command.
 Thanks for your help in advance!!
 Pahbie
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 29, 2005
        
        Hi
I need to be able to do the following things with the Microsoft Web Browser:-
1. Back page
2. Find what the current pages
3. perform code on load of a new page
Help
Sean
	View 4 Replies
    View Related
  
    
	
    	
    	Apr 4, 2006
        
        From MS Access, I want to export my files to MS excel. However, i want to allow the user to open up windows file browser to select the folder n filename. Any advice on how can i go about coding this?
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 10, 2006
        
        i am using file browser to save a file in MS ACCESS forms. However, i want another file browser to allow the user to specify the folder he wants, then from the folder he selects, i will generate a series of codes. Any advice on How can tat be done?
thks
FT :)
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 9, 2005
        
        Below is the code I'm using to try and view the microsoft page in my Access Form, but its not working for me. 
I searched for the name of the Web Browser by inserting it into Excel and reading the name from the Excel NameBox. Is the another way of confirming the name of the Web Browser?
Private Sub Form_Load()
Me!WebBrowser1.Navigate "http://www.microsoft.com"
End Sub
If I have the correct name of the Web Browser does anyone have any ideas how I can troubleshoot this problem? 
Currently, I use two browsers (Avant and IE)
Thxs
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 25, 2006
        
        Hi Access World Community,
Im fairly new to vba and was wondering how I can refer to a username field and login field on a website that is within my Microsoft Web browser control.
I have some code below but it is giving me error91 Object vairable or With Block variable not set.
Private Sub Combo2_AfterUpdate()
Me.WebBrowser1.Navigate URL:=Me.Combo2.Text
Me.WebBrowser1.Document.Username.Value = "tester"
End Sub
It navigates to the site fine so it is narrowed down to {Me.WebBrowser1.Document.Username.Value} being the problem.
P.S. The website is https://www.taylorbeandirect.com/default.aspx
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 8, 2006
        
        I would like to edit a MS Database structure from a Web Browser using ASP. What I mean is I would like to be able to add more columns to a database table or delete or rename...Not the data that is already in the columns... Is this possible? If so can some one please point me in the right direction. I've searched these forums and have not been able to find the answer.
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 18, 2014
        
        I am making a point of sale system using access 2010. I want to run the main form through a web browser.
	View 1 Replies
    View Related
  
    
	
    	
    	May 28, 2014
        
        I have developed an access database whereby multi users are using via front end application. I have split the database into back end and front end. 
Problem is each time i make a change to the front end, I have to go to each pc to update. Apart from this, any other programmer can easily see all my workings and can copy my database.
I want an option whereby when i make any changes to the front end, then the user will get the change upon the next login. I was thinking of using the front end over the local intranet web browser. will have one front end and all users will be connected to that. any changes i make will be on that  front end and they will see the change upon next login.
My other problem is that I do not want the front end to be stored at the user's end as any programmer can access my tables, forms, queries, reports, macros even if i disabled the navigation option.
	View 3 Replies
    View Related
  
    
	
    	
    	May 26, 2005
        
        I am trying to create a database such that everyone in my company will be able to access it, but without having to install access and put a link to the DB on every computer.  Ideally, I would like to have some sort of web applet that uses the DB on a central server and allows users to add and modify entries without having to know anything about Access.
Any help would be appreciated
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 2, 2013
        
        I'm trying to use the Access 2010 web browser control to dynamically show a PDF.  
The base file path is a constant (R:MS_ACCESS_PROJECTSSAFETYIMAGESMSDS SHEETS)
and the dynamic part is two fields from the selected record:
me.txtMsdsID & "." & me.txtVersion
what is the simplest way to "bind" this so that when a record changes it automatically refreshes this control?  I've tried setting it with VBA, but it's not working consistently.
I know the issues isn't the file path, as it works fine if I paste it in windows explorer.
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 12, 2014
        
        Just wondering if there is a web browser control or work around for reports?
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 17, 2011
        
        I created a new form and subform and set an "On Update" event on one of the fields.
Went to Visual Basic and can't find the form or subform in the object browser.  What gives?  How do I create the code when I can't find the object?
	View 1 Replies
    View Related
  
    
	
    	
    	Dec 9, 2004
        
        trying to get; add picture, done. i´m using the northwind example in my database. below is the code behind my form.
 
  Code:Option Compare Database Option Explicit Dim path As String  Private Sub cmdExit_Click() DoCmd.Close End Sub  Private Sub cmdMenu_Click() DoCmd.Close DoCmd.OpenForm "frmMenu", acNormal, , , acFormReadOnly End Sub  Private Sub cmdNieuweFoto_Click() getFileName End Sub  Private Sub Form_RecordExit(Cancel As Integer) ' De label errormsg verbergen om te voorkomen dat het scherm ' knippert bij het navigeren naar een andere record. ErrorMsg.Visible = False End Sub  Private Sub cmdFotoVerwijderen_Click() Me![ImagePath] = "" hideImageFrame ErrorMsg.Visible = True End Sub  Private Sub Form_AfterUpdate() ' Query opnieuw uitvoeren op de keuzelijst met invoervak ' Superieur nadat een record is gewijzigd. Vervolgens de ' label errormsg weergeven als er geen naam voor het ' fotobestand is ingevuld of de foto weergeven als een ' geldige bestandsnaam is ingevuld.  On Error Resume Next showErrorMessage showImageFrame If (IsRelative(Me!ImagePath) = True) Then Me![ImageFrame].Picture = path & Me![ImagePath] Else Me![ImageFrame].Picture = Me![ImagePath] End If End Sub  Private Sub ImagePath_AfterUpdate() ' De foto van de medewerker weergeven zodra het fotobestand ' is geselecteerd. On Error Resume Next showErrorMessage showImageFrame If (IsRelative(Me!ImagePath) = True) Then Me![ImageFrame].Picture = path & Me![ImagePath] Else Me![ImageFrame].Picture = Me![ImagePath] End If End Sub  Sub getFileName() ' Geeft het Office-dialoogvenster Bestand openen weer van ' waaruit een fotobestand voor de huidige medewerkersrecord ' kan worden gekozen. Het geselecteerde bestand wordt in het ' besturingselement voor afbeeldingen weergegeven. Dim fileName As String Dim result As Integer With Application.FileDialog(msoFileDialogFilePicker) .Title = "Foto van medewerker selecteren" .Filters.Add "Alle bestanden", "*.*" .Filters.Add "Gifs", "*.gif" .Filters.Add "Bitmaps", "*.bmp" .FilterIndex = 3 .AllowMultiSelect = False .InitialFileName = CurrentProject.path result = .Show If (result <> 0) Then fileName = Trim(.SelectedItems.Item(1)) Me![ImagePath].Visible = True Me![ImagePath].SetFocus Me![ImagePath].Text = fileName Me![merk].SetFocus Me![ImagePath].Visible = False End If End With End Sub  Sub showErrorMessage() ' De label errormsg weergeven als het fotobestand niet ' beschikbaar is. If Not IsNull(Me![foto]) Then ErrorMsg.Visible = False Else ErrorMsg.Visible = True End If End Sub  Function IsRelative(fName As String) As Boolean ' Onwaar als resultaat geven als de bestandsnaam een station ' of UNC-pad bevat IsRelative = (InStr(1, fName, ":") = 0) And (InStr(1, fName, "\") = 0) End Function  Sub hideImageFrame() ' Het besturingselement voor afbeeldingen verbergen Me![ImageFrame].Visible = False End Sub  Sub showImageFrame() ' Het besturingselement voor afbeeldingen weergeven Me![ImageFrame].Visible = True End Sub   
 
 the remove picture button works fine, the picture is actualy removed from the database. but the add picture buton wont work, i get an error. i have a idea wy. the northwind DB uses text in its table for the picture ( to define a path). but my database is using OLE object in the table for the pictures. i select add object » use file » and browse for the pic (and fill the checkbox to merge the pic with the DB). northwind uses "getFile" (opens a file browser) to define a path and i think it´s only text based and won´t work with OLE objects. 
 does annybody know the code to get the OLE Object browser (see atached pic).
 
 to make it short: neet the code to open the OLE Object browser (if there is a code). if somebody thinks the problem is something else, tell me plz.
 
 thanks
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 15, 2014
        
        I have a form that displays a html document in a WebBrowser object. This displays fine on screen but shows up blank when printing the form. Is there any way to get this to appear on the print? I know you can right-click on the object and select "print" to print the contents of the object but ideally I'd like the page to print in the context of the form. Is this possible?
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 17, 2015
        
        I have developed on ms access project (MS OFFICE 2010) i am trying to make it online so anyone can open Forms through browser.
Does it possible to make ms access Form online and view in browser? if yes then how?
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 9, 2015
        
        I am unable to link MySQL database to my local Access Database due to having a Dynamic IP (not the best of providers we chose)...
Is it possible to export a new appended record to a .php file which then sends data to MySQL via a hidden browser?
Sounds very long winded but I cant keep importing data tables directly in MySQL.
	View 1 Replies
    View Related
  
    
	
    	
    	May 9, 2015
        
        Trying to get google maps to display on a form.
When it loads google maps webpage it goes straight to a page that says the following.
"You seem to be using an unsupported browser. Old browsers can put your security at risk, are slow and don't work with  newer Google Maps features. To access Google Maps, you'll need to update to a modern browser".
	View 6 Replies
    View Related
  
    
	
    	
    	Jul 1, 2014
        
        I'm on Access 2010
I am using a web browser control on one of my forms The problem is that when I close my application down, after using the form with the wbc, an access process keeps running in the background. More severe: every time I start my app again and close it, another access process is added to the processes that are already running.
	View 14 Replies
    View Related
  
    
	
    	
    	Dec 20, 2014
        
        The code below opens a PDF selected from a form. Whatever document number appears in the textbox (FICNo) on the form is the document that is opened when the command button is clicked.It works but I would like to add a message box to say File not found if the document number in the textbox has no corresponding document in the folder (ScannedFiles).
 
Code:
Option Explicit
Option Compare Database
Private Declare Function ShellExecute Lib "shell32.dll" Alias "ShellExecuteA" (ByVal hwnd As Long, ByVal lpOperation As String, _
ByVal lpFile As String, ByVal lpParameters As String, ByVal lpDirectory As String, ByVal nShowCmd As Long) As Long
Private Const SW_SHOWNORMAL As Long = 1
Private Const SW_SHOWMAXIMIZED As Long = 3
Private Sub CmdOpenDoc_Click()
ShellExecute 0, "Open", "C:UsersDavid.BallDesktopScannedFiles" & Me.FICNo & ".pdf", vbNullString, "C:", SW_SHOWNORMAL
End Sub 
How can I modify the code to do this?
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 10, 2015
        
        I've read that you cannot do a compact and repair on a database using VBA. If that is not true, how to do.  Office 2013.  I've tried:
CommandBars("Menu Bar").Controls("Tools").Controls("Database utilities") _
.Controls("Compact and repair database...").accDoDefaultAction
but that doesn't work.  I've also tried sendKeys but don't have the correct key seqence (although I would rather not use sendKeys).
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 16, 2014
        
        I am struggling to get the value off of an open form into my current form using VBA.  I am trying:
  
Me.InvoiceNumber = Forms!Invoices!InvoiceNumber
  
But it is not working.  Both fields have the same type, Number - Long Integer.
	View 1 Replies
    View Related